search for: datanames

Displaying 20 results from an estimated 40 matches for "datanames".

Did you mean: dataname
2006 Mar 28
0
Help with the code
library(survival) library(boot) data=NULL lambda=NULL result=NULL pat=rep(1:102,each=1) trt=rep(c(1,0),51) status=rep(1,102) site=rep(1:51, each=2) nr.datasets=100 seed=2006 beta=log(1/2) for (i in 1:51) { lambda[i]=1+((3-1)/50)*(i-1)} lambda1=rep(lambda, each=2) dummy=rep(c(exp(beta),1),51) elf=lambda1*dummy r=70 #the number of bootstrap replicates
2010 Jul 27
6
Eval() or parse() do not work inside function
I am writing a function where the arguments are names of objects or variable names in a data frame. To convert the strings to the objects I am using eval(parse(text=name)): f.graph.two.vbs<-function(dataname,v1){ val<-paste(dataname,v1,sep="$") val<-eval(parse(text=val)) val } However running this returns an error:
2011 Nov 11
1
Formula variable help
I have an R script with the following applicable lines: xshort <- window(s, start=st, end=ed) . . . xshort <- ts(xshort, frequency=1, start=1) . . . m1 <- m2 <- m3 <- m4 <- m5 <- m6 <- NULL m1 <- tslm(xshort ~ trend) I get an error: Error in get(dataname) : object 'xshort' not found When I do traceback() I get: 3: get(dataname) 2: tslm(xshort ~
2011 Sep 20
1
Data
Hey everybody, i am using the rugarch-package and its great! I have a pretty easy problem, but i just dont get it, so thanks if you can help me. Normally i use: / data(DATANAME) spec = ugarchspec() fit = ugarchfit(data = x[,1], spec = spec) fit slotNames(fit) names(fit at fit) coef(fit) infocriteria(fit) likelihood(fit) nyblom(fit) signbias(fit) head(as.data.frame(fit)) head(sigma(fit))
2000 May 02
2
Variable names in model formula
At 10:37 PM 5/1/00 -0400, E. S. Venkatraman wrote: >I have the following problem. I have survival data (time, status) along >with several covariates (X1, X2,..., Xn). I want to fit a Cox model for >each of the covariate (univariately) and obtain the fitted probability of >survival at a fixed time point t0 and covariate value Xi0. I tried to do >this in a for loop where the index
2011 Jan 21
3
confidence interval
Hi, I have a circular shaped set of point on the plane (X,Y) centered in zero. The distribution is more dense close to zero and less dense far from zero. I need to find the radius of a circle centered in zero that contains 65% of the points in the sample. Is there any R directive that can do this? I wanna start with 2D set of points, but the real case scenario is with a 5D set of points.
2017 Dec 04
3
Dynamic reference, right-hand side of function
Hi R-users! Being new to R, and a fairly advanced Stata-user, I guess part of my problem is that my mindset (and probably my language as well) is wrong. Anyway, I have what I guess is a rather simple problem, that I now without success spent days trying to solve. I have a bunch of datasets imported from Stata that is labelled aa_2000 aa_2001 aa_2002, etc. Each dataset is imported as a matrix, and
2017 Dec 04
0
Dynamic reference, right-hand side of function
The generic rule is that R is not a macro language, so looping of names of things gets awkward. It is usually easier to use compound objects like lists and iterate over them. E.g. datanames <- paste0("aa_", 2000:2007) datalist <- lapply(datanames, get) names(datalist) <- datanames col1 <- lapply(datalist, "[[", 1) colnum <- lapply(col1, as.numeric) (The 2nd line assumes that the damage has already been done so that you have aa_2000 ... aa_2007 in...
2017 Dec 04
3
Dynamic reference, right-hand side of function
...an at sociology.su.se> Kopia: r-help at r-project.org ?mne: Re: [R] Dynamic reference, right-hand side of function The generic rule is that R is not a macro language, so looping of names of things gets awkward. It is usually easier to use compound objects like lists and iterate over them. E.g. datanames <- paste0("aa_", 2000:2007) datalist <- lapply(datanames, get) names(datalist) <- datanames col1 <- lapply(datalist, "[[", 1) colnum <- lapply(col1, as.numeric) (The 2nd line assumes that the damage has already been done so that you have aa_2000 ... aa_2007 in yo...
2009 Oct 08
3
error message - unexpected input
I have been using R the past couple of years to run models on data we are collecting. I recently got a new computer and updated to a new version of R (2.60 -> 2.90). Since the update, I cannot get my syntax to run. I have tried copying the file it is looking for into many different directories to try and run it. In the last version, I found that it was easiest if the file was copied into the R
2017 Dec 04
0
Dynamic reference, right-hand side of function
...Kopia: r-help at r-project.org > ?mne: Re: [R] Dynamic reference, right-hand side of function > > The generic rule is that R is not a macro language, so looping of names of things gets awkward. It is usually easier to use compound objects like lists and iterate over them. E.g. > > datanames <- paste0("aa_", 2000:2007) > datalist <- lapply(datanames, get) > names(datalist) <- datanames > col1 <- lapply(datalist, "[[", 1) > colnum <- lapply(col1, as.numeric) > > (The 2nd line assumes that the damage has already been done so that you...
2012 Feb 16
2
Problem building up ggplot graph in a loop.
Folks, I want to automate some graphing using ggplot. Here is my code graphChargeOffs2<-function(coffs) { ggplot(coffs, aes(levels)) dataNames<-names(coffs)[!names(coffs) == "levels"] for(i in dataNames) { thisData<-coffs[[i]] last_plot() + geom_line(aes(y = thisData, colour = i)) } last_plot() + ylab("Total Chargeoffs") } coffs is a data.frame. I get the following error: Error in eval(expr, envir...
2008 Jul 29
4
Graphics function question
Hello I have created a graph using the following commands: <<< startBReP3O1T <- diffs$BReP3O1T - diffs$diff_BReP3O1T endBReP3O1T <- diffs$BReP3O1T x <- seq(47,89, length = 10) ymin <- min(min(startBReP3O1T), min(endBReP3O1T)) ymax <- max(max(startBReP3O1T), max(endBReP3O1T)) y <- seq(ymin, ymax, length = 10) plot(x,y, type = 'n', xlab = 'Age', ylab =
2017 Dec 04
2
Dynamic reference, right-hand side of function
...Kopia: r-help at r-project.org > ?mne: Re: [R] Dynamic reference, right-hand side of function > > The generic rule is that R is not a macro language, so looping of names of things gets awkward. It is usually easier to use compound objects like lists and iterate over them. E.g. > > datanames <- paste0("aa_", 2000:2007) > datalist <- lapply(datanames, get) > names(datalist) <- datanames > col1 <- lapply(datalist, "[[", 1) > colnum <- lapply(col1, as.numeric) > > (The 2nd line assumes that the damage has already been done so that &gt...
2010 Dec 29
1
Counting number of datasets and appending them
Hi there, I have a question on how to read a bunch of dataset, assign each of the dataset to a matrix in the memory, and append them. Suppose I have 20 dataset saved to different .rda files named gradeFileData1, gradeFileData2,...., gradeFileData20. And I would like to read them each into a dataset in the memory, then combine them. I wrote something like: e1<-new.env(parent=.GlobalEnv)
2017 Dec 05
3
Dynamic reference, right-hand side of function
....csv(text="1,0,1,1,0,0,0,0,0,0,1,0,0", header=FALSE)) bb_2001 <- as.matrix(read.csv( text="0,0,0,1,0,1,1,0,0,0,0,1,0,0", header=FALSE)) bb_2002 <- as.matrix(read.csv( text="1,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0", header=FALSE)) is.vector(bb_2000) datanames <- paste0("bb_", 2000:2002) datalist <- lapply(datanames, get) is.vector(datalist[1]) I learned a lot of code today, and I really appreciate it! A million thanks! My R-superpowers are, well, not as minuscule as when I woke up this morning. All the best, Love (or maybe LoveR, my f...
2017 Dec 04
0
Dynamic reference, right-hand side of function
...r-project.org >> ?mne: Re: [R] Dynamic reference, right-hand side of function >> >> The generic rule is that R is not a macro language, so looping of names of things gets awkward. It is usually easier to use compound objects like lists and iterate over them. E.g. >> >> datanames <- paste0("aa_", 2000:2007) >> datalist <- lapply(datanames, get) >> names(datalist) <- datanames >> col1 <- lapply(datalist, "[[", 1) >> colnum <- lapply(col1, as.numeric) >> >> (The 2nd line assumes that the damage has already...
2017 Dec 05
0
Dynamic reference, right-hand side of function
...1,0,0,0,0,0,0,1,0,0", > header=FALSE)) > bb_2001 <- as.matrix(read.csv( text="0,0,0,1,0,1,1,0,0,0,0,1,0,0", > header=FALSE)) > bb_2002 <- as.matrix(read.csv( text="1,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0", > header=FALSE)) > > is.vector(bb_2000) > > datanames <- paste0("bb_", 2000:2002) > datalist <- lapply(datanames, get) > is.vector(datalist[1]) > > > I learned a lot of code today, and I really appreciate it! A million > thanks! > My R-superpowers are, well, not as minuscule as when I woke up this > morning. &gt...
2016 Dec 12
2
accessing data by packagename::dataname from within package code fails.
I have narrowed down the problem. The error Error : 'AminoAcids' is not an exported object from 'namespace:bibliospec' Error : unable to load R code in package 'bibliospec' occurs only if I try to access the data using bibliospec::AminoAcids within the initialize method of an R reference class. It does work, as far as I tested everywhere else. In other methods of a
2005 Feb 26
3
averaging within columns
I have a dataframe with names in the first column and wait times between decisions in the second column. Since individuals make multiple decisions, I want the average for each individual. For example, the data might look like this name wtime jo 1 jo 2 jo 1 jo 3 tim 3 tim 2 tim 2 ro 1 ro 2 etc. I'm hoping there is something like mean(dataname$wtime[name]) which will just