Displaying 6 results from an estimated 6 matches for "makename".
Did you mean:
takename
2012 Dec 17
2
Suggestion: 'method' slot for format.ftable()
...or (i in rev(seq_along(lst))) {
ind <- 1 + seq.int(from = 0, to = lens[i] - 1) * cplensD[i + 1]
tmp <- character(length = cplensD[i])
tmp[ind] <- charQuote(lst[[i]])
y <- cbind(rep(tmp, times = cplensU[i]), y)
}
y
}
makeNames <- function(x) {
nmx <- names(x)
if(is.null(nmx))
nmx <- rep("", length.out = length(x))
nmx
}
xrv <- attr(x, "row.vars")
xcv <- attr(x, "col.vars")
method <- match.arg(method)
LABS <- switc...
2017 Jul 09
2
Help with ftable.svyby
...5-54", "55-64",
"65-74", ">=75"),
RACECL=c("white non hispanic", "non white or hispanic"))
Error in rbind(matrix("", nrow = length(xcv), ncol = length(xrv)),
charQuote(makeNames(xrv)), :
number of columns of matrices must match (see arg 3)
When I do the follwing instead all is good. But it only works for small
subsets!
h<-svymean(~interaction(INCOME, AGECL, RACECL), q3)
fh<-ftable(h, rownames=list(AGECL=c("<35", "35-44", "45-54"...
2017 Mar 24
2
Problem about API difference between LLVM3.5 and LLVM3.9
...dress_space));
4 //Duplicate arguments
5 std::vector<Argument *> arg_list;
6 for each_custom(arg, *func, arg_begin, arg_end)
7 arg_list.push_back(&*arg);
8 for each(arg, arg_list){
9 Argument *arg_dup = new Argument((*arg)->getType(),
makeName(*arg, "_dup"));
10 func->getArgumentList().insertAfter((*arg)->getIterator(),
arg_dup);
11 }
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://lists.llvm.org/pipermail/llvm-dev/attachments/20170324/6648b45b/attachment.html>...
2017 Jul 09
0
Help with ftable.svyby
...quot;,
> "65-74", ">=75"),
> RACECL=c("white non hispanic", "non white or hispanic"))
>
> Error in rbind(matrix("", nrow = length(xcv), ncol = length(xrv)),
> charQuote(makeNames(xrv)), :
> number of columns of matrices must match (see arg 3)
>
> When I do the follwing instead all is good. But it only works for small
> subsets!
>
> h<-svymean(~interaction(INCOME, AGECL, RACECL), q3)
>
> fh<-ftable(h, rownames=list(AGECL=c("<35"...
2004 Jun 24
0
Problem with predict arima
I have fitted an arima(0,0,2) model to my data, and am trying to plot a
forecast for the next 15 time steps, but each time i try I am given the
following error message:
Error in .cbind.ts(list(...), makeNames(...), dframe = dframe, union =
TRUE) :
non-time series not of the correct length
I am calculating as follows:
my.arima<-arima(my.list,order=c(0,0,2))
my.forecast<-predict(my.arima,15)
ts.plot(my.list,my.forecast$pred,my.forecast$pred+2*my.forecast$se,
myforecast$pred-2*my.f...
2004 Jun 24
0
problem with arima
...edu
From: Laura Quinn <laura at env.leeds.ac.uk>
Subject: [R] Problem with predict arima
I have fitted an arima(0,0,2) model to my data, and am trying to plot a
forecast for the next 15 time steps, but each time i try I am given the
following error message:
Error in .cbind.ts(list(...), makeNames(...), dframe = dframe, union =
TRUE) :
non-time series not of the correct length
I am calculating as follows:
my.arima<-arima(my.list,order=c(0,0,2))
my.forecast<-predict(my.arima,15)
ts.plot(my.list,my.forecast$pred,my.forecast$pred+2*my.forecast$se,
myforecast$pred-2*my.f...