search for: tframe

Displaying 20 results from an estimated 46 matches for "tframe".

Did you mean: frame
2009 Jun 15
2
Help with syntax error
...I have written boxplot commands of this form before, but I don''t quite understand why the function call is reporting a syntax error in this instance. All parameters passed to the function are strings. Thanks in advance. Payam > simplevar <- function(wframe,column1,column2) { + tframe <- get(wframe) + x1 <- which(names(wframe)==column1) + x2 <- which(names(wframe)==column2) + print(tframe[x1]) + print(tframe[x2]) + gtitle <- paste(names(tframe[x2])," vs. ", names(tframe[x1]) + quartz(width=7,height=5,dpi=200) Error: syntax error >...
1997 Oct 23
0
R-beta: time series structures
...large library of routines for time series analysis. Attached below is some more explaination. Let me know is you want the code. Paul Gilbert ________________ <H2>Description</H2> <UL> Generic methods for handling time. </UL> <H2>Details</H2> <UL> <I>tframe</I> objects implement a scheme for using classes and methods to handle different time representations in S. This provides a method by which code can be developed without too much dependence on the representation of time. For example, many time series programs only use the fact that data is ar...
1998 May 15
1
couldn't find function "print.tframe"
I have an object with an attribute "tframe" for which there is a generic method print.tframe and also a method print.tframe.default defined in a library. However, when I use attributes(object) I get the message $tframe Error: couldn't find function "print.tframe" It's as if <primitive: attributes> is not looki...
2001 May 24
1
tframe question - latest.start
I'm having some trouble figuring out latest.start in the tframe package. The results seem a bit cloudy. Sample session: > library(ts) > library(tframe) Loading required package: syskern > t1<-ts(c(1,2,3,4,5),start=1) > t2<-ts(c(1,2,3,4,5),start=2) > earliest.start(tbind(t1,t2)) [1] 1 1 > earliest.start(tbind(t2,t1)) [1] 1 1 > late...
1998 Nov 18
4
more on "[<-"
"[<-" in R 0.63 does not appear to strip attributes, whereas Splus and previous versions of R did. Paul _____ R 0.63: > data <- matrix(rnorm(300),100,3) > attr(data, "tframe") <- c(1981.50, 2006.25 , 4.00) > attributes(data) $dim [1] 100 3 $tframe [1] 1981.50 2006.25 4.00 > z <- data[10:90,] > attributes(z) $dim [1] 81 3 $tframe [1] 1981.50 2006.25 4.00 Splus: > data <- matrix(rnorm(300),100,3) > attr(data, "tframe"...
1997 Dec 11
1
R-alpha: inheritance ([.ts)
While commenting out the previously mentioned warning seems to work, I have been reflecting on this problem and there seems to be an issue wrt inheritance that I do not understand properly. Perhaps some gurus could comment. As mentioned previously, I have a class "tframe" with more specific classes indicating how time is being represented, such as > class(tframe(data)) [1] "ts" "tframe" and in R0.60 "[.ts" produces warning messages when I use tframe(data)[2]. Now tframe(data) is NOT a "ts", it is a specific kind...
2001 Sep 28
2
problems with new checks in R-devel
Below are a few problems I have encountered with the new checks being done in R-devel. 1/ I have two generics, test.equal and test.equal.tframe. The first checks that two objects are equal while the second checks if two objects have equal tframes (time frames). There is no reason these should have similar arguments but the check seems to think that test.equal.tframe is a method for test.equal so I get: * checking generic/method consisten...
1997 Dec 10
1
R-alpha: "[.ts" in 0.60.1
I have a class "tframe" with more specific classes indicating how time is being represented, such as > class(tframe(data)) [1] "ts" "tframe" but now "[.ts" produces warning messages > tframe(data)[2] Warning: Not returning a time series object [1] 2006.25 Even my simplest...
2004 Feb 26
1
unable to install dse in mac OS X 10.3
...Formats: text html latex example 00Intro.setRNG text html latex example getRNG text html latex example setRNG text html latex example * DONE (setRNG) * Installing *source* package 'tframe' ... ** R ** inst ** help >>> Building/Updating help pages for package 'tframe' Formats: text html latex example 00Intro.tframe text html latex <snip> trimNA text html latex example * DONE (tf...
2005 Feb 02
1
windows dse bundle install problem
...application/zip' length 1570336 bytes opened URL downloaded 1533Kb bundle 'dse' successfully unpacked and MD5 sums checked Delete downloaded files (y/N)? y updating HTML package descriptions Warning message: unable to move temp installation 'C:/PROGRA~1/R/rw2001/library\file1104/tframe' to 'C:/PROGRA~1/R/rw2001/library/tframe' > library() Two packages in the bundle installed ok, but tframe did not. I'm not sure why there is a backslash after the first library and nowhere else. Is this a user error or a bug? Paul Gilbert
2005 Dec 23
1
dse package problems
...e are two examples of error messages generated when trying to execute some simple programs. The code was taken directly from the package documentation. Any help on this will be greatly appreciated. Merry Christmas Fernando #################################### # First Example > library("tframe") Loading required package: setRNG > library("dse1") Attaching package: 'dse1' The following object(s) are masked from package:stats : acf simulate > library("dse2") > > fileName <- system.file("otherdata", "eg1.da...
1997 Dec 11
0
R-alpha: "[.ts" warning "Not returning time series.."
On 11-Dec-97 maechler@stat.math.ethz.ch wrote: >>>>>> "PaulG" == Paul Gilbert <pgilbert@bank-banque-canada.ca> writes: > > PaulG> I have a class "tframe" with more specific classes indicating > PaulG> how time is being represented, such as > > >> class(tframe(data)) > PaulG> [1] "ts" "tframe" > > PaulG> but now "[.ts" produces warning messages > > >> tfra...
2003 Dec 12
2
Reorganization of packages in the R distribution
...ctest eda lqs modreg mva nls ts as stub packages which ensure back-compatibility. (These have all been merged into stats except lqs which rejoins rlm in MASS.) There are a small number of CRAN packages that attempt to modify system functions and so will need updating. (Known examples are in dse:tframe, gregmisc and mclust and some testing code elsewhere.) What will happen about datasets is currently under discussion. These are split between base and stats for historical reasons, except that all time series datasets (and ts and its methods) are now in stats. -- Brian D. Ripley,...
1998 Jun 17
3
bug in functions of form "mcpar<-"
This fairly harmless looking piece of code, which worked in 0.61 (and in S-PLUS) fails in 0.62.1. R> "mcpar<-" <- function(x,mcpar) {attr(x,"mcpar") <- mcpar; x} R> mcpar(x) <- c(1,100,1) Error in mcpar<-(*tmp*, value = c(1, 100, 1)) : unused argument to function The error message gives a hint about how to work around the problem - just replace the
1999 Dec 21
1
DSE revised for R 0.90.1
...lightly revised version of my DSE package for multi-variate time series analysis is now available at <www.bank-banque-canada.ca/pgilbert>. This version works with R 0.90.1 (and not with R 90.0 or earlier versions). It can also be installed with install.packages(c("syskern", "tframe", "dse"), contriburl="http://www.bank-banque-canada.ca/pgilbert/dse/R") A draft version of the new users guide is also available at the web site. Comments would be appreciated. I will put a version of the libraries on CRAN in the new year. Paul Gilbert -.-.-.-.-.-.-.-....
1999 Dec 21
1
DSE revised for R 0.90.1
...lightly revised version of my DSE package for multi-variate time series analysis is now available at <www.bank-banque-canada.ca/pgilbert>. This version works with R 0.90.1 (and not with R 90.0 or earlier versions). It can also be installed with install.packages(c("syskern", "tframe", "dse"), contriburl="http://www.bank-banque-canada.ca/pgilbert/dse/R") A draft version of the new users guide is also available at the web site. Comments would be appreciated. I will put a version of the libraries on CRAN in the new year. Paul Gilbert -.-.-.-.-.-.-.-....
2009 Apr 16
1
How can I catch errors thrown from c via the Rcpp error() function?
...> x <- try(stop(simpleError('blah'))) Error : blah > x [1] "Error : blah\n" attr(,"class") [1] "try-error" 2. This is an example using flowClust (using real data, set up to guarantee that the error is thrown): > x <- try(res30 = flowClust(tFrame, K=30, B=1000, varNames=c('CD4', 'CD8','KI67', 'CD45RO', 'CD28', 'CD57', 'CCR5', 'CD19', 'CD27', 'CCR7', 'CD127'))) Error in flowClust(tFrame, K = 30, B = 1000, varNames = c("CD4", "CD8",...
1999 Jul 27
2
Memory profiling/benchmarking
Hi, As a project for a computer performance analysis paper I am taking this semester, I am going to look at the performance of the memory manager in R, with the aim of determining how fast it is and which areas most need improvement. The idea is that I will compare various versions of R, starting with 0.64.2, and then at a few stages in the implementation of the new memory management scheme (of
2008 Feb 05
2
How to generate table output of t-test
Hi, Given test <- matrix(c(1, 1,2,2), 2,2) t <- apply(test, 1, t.test) How can I obtain a table of p-values, confidence interval etc, instead of [[1]] One Sample t-test data: newX[, i] t = 3, df = 1, p-value = 0.2048 alternative hypothesis: true mean is not equal to 0 95 percent confidence interval: -4.853102 7.853102 sample estimates: mean of x 1.5 [[2]]
2012 Apr 29
0
need help with avg.surv (Direct Adjusted Survival Curve)
...els=unique(data.patterns)) if(missing(weights)) weights <- table(data.patterns) else weights <- tapply(weights, data.patterns, sum)         kp <- !duplicated(data.patterns) mframe <- mframe[kp,]         obs.var <- mframe[,var.num]         lps <- (cfit$linear.predictor)[kp]         tframe <- mframe[rep(1,length(var.values)),]         tframe[,var.num] <- var.values         xmat <- model.matrix(cfit,data=tframe)[,-1]         tlps <- as.vector(xmat%*%cfit$coef)         names(tlps) <- var.values         obs.off <- tlps[as.character(obs.var)]          explp.off <- ex...