I have a vector of numbers
x <- c(2,5,1,6)
and I am trying to generate a sequence of values -- starting from 1 -- between and including the values in x
so that I am left with the following string
1,2,3,4,5,4,3,2,1,2,3,4,5,6
I have tried to find the function I need to perform this task (e.g. seq, order, arrange) however I can't seem to find what I need to do this.
This seems to work, assuming an implicit initial value of 1:
res <- Reduce(function(y, z) c(head(y,-1), tail(y,1):z), x, init=1L)
# 1 2 3 4 5 4 3 2 1 2 3 4 5 6
If you must have it as a comma-ed string: paste(res, collapse=",")
.
For a large problem, this will become pretty inefficient, since I'm growing an object in a loop. I'd suggest the Rcpp package for that case, or working out the math more carefully.
We can use an Rcpp
implementation. If the file is 'file1.cpp'
#include <Rcpp.h>
//[[Rcpp::export]]
using namespace Rcpp;
// [[Rcpp::export]]
List rleC(NumericVector x) {
std::vector<int> lengths;
std::vector<double> values;
// Initialise first value
int i = 0;
double prev = x[0];
values.push_back(prev);
lengths.push_back(1);
NumericVector::iterator it;
for(it = x.begin() + 1; it != x.end(); ++it) {
if (prev == *it) {
lengths[i]++;
} else {
values.push_back(*it);
lengths.push_back(1);
i++;
prev = *it;
}
}
return List::create(
_["lengths"] = lengths,
_["values"] = values
);
}
// [[Rcpp::export]]
Rcpp::NumericVector newSeq(Rcpp::NumericVector z) {
int zlen = z.length();
Rcpp::List zlist(zlen);
for(int i = 0; i < zlen; i++){
if(z[i+1] > z[i]) {
zlist[i] = Rcpp::seq(z[i], z[i+1]);
} else {
zlist[i] = Rcpp::rev(Rcpp::seq(z[i+1], z[i]));
}
}
Rcpp::Environment stats1("package:base");
Rcpp::Function unlist = stats1["unlist"];
return rleC(unlist(Rcpp::head(zlist, -1)))["values"];
}
We source the file
library(Rcpp)
sourceCpp("file1.cpp")
c(1, newSeq(x))
#[1] 1 2 3 4 5 4 3 2 1 2 3 4 5 6
Also, using a base R
option (earlier deleted answer)
v1 <- rle(unlist(Map(":", x[-length(x)], x[-1])))$values
c(seq(v1[1]), v1[-1])
#[1] 1 2 3 4 5 4 3 2 1 2 3 4 5 6
Another work around using mapply
:
c(1, unlist(mapply(function(s,e) tail(s:e,-1), head(c(1,x),-1), x)))
#[1] 1 2 3 4 5 4 3 2 1 2 3 4 5 6
OR
c(seq(x[1]-1),
unlist(sapply(seq(length(x)-1), function(i) head(x[i]:x[i+1], -1))),
tail(x,1))
#[1] 1 2 3 4 5 4 3 2 1 2 3 4 5 6
Benchmarking (base
R solutions)
library(microbenchmark)
set.seed(1)
x <- sample(1000, 500, replace = FALSE)
f_Frank <- function(x) Reduce(function(y, z) c(head(y,-1), tail(y,1):z), x, init=1L)
f_989_1 <- function(x) c(1, unlist(mapply(function(s,e) tail(s:e,-1), head(c(1,x),-1), x)))
f_989_2 <- function(x)
c(seq(x[1]-1),
unlist(sapply(seq(length(x)-1), function(i) head(x[i]:x[i+1], -1))),
tail(x,1))
f_akrun <- function(x){
v1 <- rle(unlist(Map(":", x[-length(x)], x[-1])))$values
c(seq(v1[1]), v1[-1])
}
r <- f_Frank(x)
all(r==f_989_1(x))
#[1] TRUE
all(r==f_989_2(x))
#[1] TRUE
all(r==f_akrun(x))
#[1] TRUE
res <- microbenchmark(f_Frank(x), f_989_1(x), f_989_2(x), f_akrun(x))
print(res, order="mean")
# Unit: milliseconds
# expr min lq mean median uq max neval
# f_989_1(x) 5.851345 6.113956 6.627022 6.308359 7.256490 9.286613 100
# f_989_2(x) 5.604960 5.794707 7.260833 5.946143 6.876246 58.284487 100
# f_akrun(x) 6.826068 7.726124 13.491295 8.263214 8.983740 63.384959 100
# f_Frank(x) 287.564706 340.390713 351.593511 344.465231 359.258399 454.095461 100
If you love us? You can donate to us via Paypal or buy me a coffee so we can maintain and grow! Thank you!
Donate Us With