Re: BSOD with ESS[R] under win2000

2003-03-05 Thread ripley
Was there anything to indicate that this was a problem in R (and not emacs nor Windows, especially a Windows driver)? Those of us who never experience it will not be familiar with `BSOD': it is I presume the blue screen shown by a fatal error in Windows internals. I think I have seen just once un

RE: BSOD with ESS[R] under win2000

2003-03-05 Thread Darryl Greig
It's certainly a difficult problem to isolate - as you say it may well be connected to some other combination of application / drivers. I shall investigate emacs help as a next step. -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] Sent: Wednesday, March 05, 2003 10:08

Re: [R] How to extract R{i} from lme object?

2003-03-05 Thread Peng
--- Renaud Lancelot <[EMAIL PROTECTED]> wrote: > Hi Peng, > > Peng wrote: > [snip] > > I am still wondering whether there is a function > like > > getVarCov(), so that I can get R var-cov matrix > > directly. I looked through the function list of > nlme, > > but I cannot find. > > > > Peng > >

Rtips still up (was Re: [R] How to draw several plots in one figure?

2003-03-05 Thread Paul Johnson
Dear Feng and everybody I still have my list of "how to" things for R and sometimes I even try to add more. Here's the address http://lark.cc.ku.edu/~pauljohn/R/statsRus.html I can't tell if you want to have several plots on the same page, in which case you should use this item: http://lark.cc

[R] Dataframe in loop

2003-03-05 Thread Ronaldo Reis Jr.
Hi, I try to make a dataframe in a loop function, but I dont have succeed. The function is something like this: for(i in c(10,12)) { expr for(j in c(1:2) { total <- c(1,2,3,4,5,6,7) nspf <- length(levels(as.factor(total))) fin <- data.frame(L=i,N=nspf)

[R] Transfer Function Modeling

2003-03-05 Thread Richard A. Bilonick
I want to forecast a time series Y using a model that includes previous values of Y and an exogenous time series X using a transfer function. The standard procedure as described in Box and Jenkins and numerous other references is to first fit an ARIMA model to X. Use the ARIMA model to computer

[R] Transfer Function Modeling

2003-03-05 Thread Richard A. Bilonick
I think I've figured out the use of "filter" in the ts package, at least for a simple AR model. I simulated a simple AR time series, modeled it using "arima", and then used "filter" to compute the 1-step ahead forecasts: > y.arma <- arima.sim(list(ar=0.8),n=200) > y.arma.arima <- arima(y.arma,

[R] Does barplot handle log scales?

2003-03-05 Thread Tommy E. Cathey
Does barplot handle log scales? Every time I try to pass log="y" to barplot I get the following error message. >barplot(height=t(array(c(d1,d2,d3,d4),dim=c(NROW(d1),4))),ann=FALSE,axes=FALSE,col=c("#ff","#ff","#00ff00","#00"),horiz=FALSE,width=c(0.5),space=c(1.2,2.0),beside=FALSE,log="

RE: [R] Does barplot handle log scales?

2003-03-05 Thread Marc Schwartz
>-Original Message- >From: [EMAIL PROTECTED] >[mailto:[EMAIL PROTECTED] On Behalf Of Tommy E. Cathey >Sent: Wednesday, March 05, 2003 12:40 PM >To: [EMAIL PROTECTED] >Subject: [R] Does barplot handle log scales? > > >Does barplot handle log scales? Every time I try to pass >log="y" to bar

[R] reserved words documentation

2003-03-05 Thread white . denis
I wanted a data frame component to be named "next", for example: > m <- data.frame (matrix (0, nrow=2, ncol=2)) > names (m) <- c("prev", "next") > m prev next 100 200 But "next" being reserved prevents $ indexing without quotes: > m$next Error: syntax error > m$"next" [1] 0 0

Re: [R] Dataframe in loop

2003-03-05 Thread Michael Na Li
On Wed, 5 Mar 2003, Ronaldo Reis, Jr. verbalised: > Hi, > > I try to make a dataframe in a loop function, but I dont have succeed. > > The function is something like this: > > for(i in c(10,12)) { > expr what's this? >for(j in c(1:2) { > total <- c(1,2,

Re: [R] reserved words documentation

2003-03-05 Thread ripley
I had to read the R sources for `S Programming', which says There are some reserved words you will not be allowed to use, for example \begin{source} FALSE Inf NA NaN NULL TRUE break else for function if in next repeat while \end{source} and in the \s. engines (but not \R.) \sfn{return}, \sfn{F} an

[R] problem with ccluster package

2003-03-05 Thread Igor Oleinik
Hello, I am calling cclust function in cclust package repeatedly until some ceratain conditions for a cluster are met. Unfortunately, the system crashes on the second call (after debugging). # kmeans res1 is a well defined matrix cl <- cclust(res1, as.numeric(ncntrs), iter.max = 20, verbose =

RE: [R] reserved words documentation

2003-03-05 Thread Liaw, Andy
Section 10.3.3 in the R Language Manual, as distributed with R. Andy > -Original Message- > From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] > Sent: Wednesday, March 05, 2003 1:52 PM > To: [EMAIL PROTECTED] > Subject: [R] reserved words documentation > > > I wanted a data frame compone

[R] reading in tab delimited data in a loop

2003-03-05 Thread Edmond Ng
Dear all, I need to read in 4 sets of tab delimited data in a loop. The 4 data sets are called "simu1.dat", "simu2.dat" and so on. I know what I need on the righthand side of the read.table expression but I can't the left hand side of it to work (see the line in bold below). Can you kindly he

Re: [R] problem with cclust[er] package

2003-03-05 Thread ripley
On Wed, 5 Mar 2003, Igor Oleinik wrote: > I am calling cclust function in cclust package > repeatedly until some ceratain conditions > for a cluster are met. Unfortunately, > the system crashes on the second call (after debugging). > > # kmeans res1 is a well defined matrix > cl <- cclust(res1,

[R] PL/R is being noticed in the PostgreSQL community

2003-03-05 Thread Douglas Bates
I was reading postings to the pgsql-general discussion list for PostgreSQL and found this interesting reference to PL/R. The latest postgresql packages for Debian GNU/Linux (unstable) have PL/R built in to the PostgreSQL server. --- Begin Message --- Derrick Rapley wrote: > What I want to know i

RE: [R] problem with cclust[er] package

2003-03-05 Thread Igor Oleinik
I have checked that section already. Sorry, I should have mentioned that. Memory limit increase does not work. Installtion of msvcrt.dll does not work either. Thank you. -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] Sent: Wednesday, March 05, 2003 2:44 PM To: Igor

Re: [R] reading in tab delimited data in a loop

2003-03-05 Thread David Clifford
simu1 <- matrix(0,3,3) simu2 <- matrix(0,3,3) simu3 <- matrix(0,3,3) simu4 <- matrix(0,3,3) ## save to files write.table(simu1,"simu1.dat") write.table(simu2,"simu2.dat") write.table(simu3,"simu3.dat") write.table(simu4,"simu4.dat") ## read from files into a list called simu simu <- list(NULL) fo

RE: [R] reading in tab delimited data in a loop

2003-03-05 Thread Liaw, Andy
There's no bold face in plain text. I assume it's the line inside the loop that's giving you trouble. Two approaches: 1. for(i in 1:4) assign(paste("simu", i, sep=""), read.table(...)) 2. simu <- vector(4, mode="list") for(i in 1:4) simu[[i]] <- read.table(...) Andy > -Original Message

Re: [R] reading in tab delimited data in a loop

2003-03-05 Thread Douglas Bates
"Edmond Ng" <[EMAIL PROTECTED]> writes: > Dear all, > > I need to read in 4 sets of tab delimited data in a loop. The 4 data sets are > called "simu1.dat", "simu2.dat" and so on. I know what I need on the righthand side > of the read.table expression but I can't the left hand side of it to wo

RE: [R] problem with cclust[er] package

2003-03-05 Thread Igor Oleinik
Here is a bit of outer loop too: library(cclust) # clustering algorithm using k-means bDone <- 0 ncntrs <- 2 browser() while (bDone == 0) {

Re: [R] reading in tab delimited data in a loop

2003-03-05 Thread Douglas Bates
Douglas Bates <[EMAIL PROTECTED]> writes: > "Edmond Ng" <[EMAIL PROTECTED]> writes: > > > Dear all, > > > > I need to read in 4 sets of tab delimited data in a loop. The 4 data sets are > > called "simu1.dat", "simu2.dat" and so on. I know what I need on the righthand > > side of the read.ta

[R] printing POSIXct values in table labels

2003-03-05 Thread David Kane
Hi, I think that there is something that I am misunderstanding in creating tables using dates that are of class POSIXct. Consider: > x <- data.frame(date = as.POSIXct(strptime(c(rep("2002-10-17", 4), rep("1999-12-08", > 2)), format = "%Y-%m-%d"))) > x date 1 2002-10-17 2 2002-10-17 3 200

Re: [R] reserved words documentation

2003-03-05 Thread Robin Hankin
Hello everybody. Andy Liaw points to: > > Section 10.2.3 in the R Language Manual, as distributed with R. > which lists reserved words. if else repeat while function for in next break TRUE FALSE NULL NA Inf NaN .. ..1 ..2 <\quote> QUESTION: where is "..1" documented? R> help.search("..1

[R] how to find the location of the first TRUE of a logical vector

2003-03-05 Thread Jason Liao
without having to check the vector element by element? Thanks a lot! Jason = Jason G. Liao, Ph.D. Division of Biometrics University of Medicine and Dentistry of New Jersey 335 George Street, Suite 2200 New Brunswick, NJ 08903-2688 phone (732) 235-8611, fax (732) 235-9777 http://www.geocities.

[R] cor.test in matrices

2003-03-05 Thread juli g. pausas
Hi, For computing correlation among variables in a matrix, I use cor( ), but for computing the p-values I'm using cor.test in the following way: cor.p <- function(X) { res <- matrix(0, ncol(X), ncol(X)) for (i in 1:ncol(X)) for (j in 1:ncol(X)) res[i, j]<- cor.test(X[, i], X[, j])$p.value rowname

RE: [R] how to find the location of the first TRUE of a logicalvector

2003-03-05 Thread Marc Schwartz
>-Original Message- >From: [EMAIL PROTECTED] >[mailto:[EMAIL PROTECTED] On Behalf Of Jason Liao >Sent: Wednesday, March 05, 2003 3:36 PM >To: [EMAIL PROTECTED] >Subject: [R] how to find the location of the first TRUE of a >logical vector > > >without having to check the vector element by

[R] Re: linear model with arma errors

2003-03-05 Thread Rob Hyndman
> Dear all, > > I'm looking for how can I estimate a linear model with ar(ma) errors : > > y(t)=a*X(t)+e(t) with > P(B)e(t)=Q(B)u(t) > > where u is a white noise and P, Q are some polynomes. > > Could you help me ? Isn't this what arima in library ts does? Put X(t) into xreg and specify the o

Re: [R] how to find the location of the first TRUE of a logicalvector

2003-03-05 Thread Douglas Bates
Jason Liao <[EMAIL PROTECTED]> writes: > without having to check the vector element by element? Thanks a lot! If vec is your vector of logical values then match(TRUE, vec) should work. It will return NA if there are no TRUE values. __ [EMAIL PROTECT

Re: [R] cor.test in matrices

2003-03-05 Thread Frank E Harrell Jr
On Wed, 05 Mar 2003 22:34:16 +0100 "juli g. pausas" <[EMAIL PROTECTED]> wrote: > Hi, > For computing correlation among variables in a matrix, I use cor( ), but > for computing the p-values I'm using cor.test in the following way: > > cor.p <- function(X) > { > res <- matrix(0, ncol(X), ncol(X))

Re: [R] how to find the location of the first TRUE of a logicalvector

2003-03-05 Thread Martina Pavlicova
It might not be the most elegant, but it works: > foo <- c(F, F, T, F, T, T, F ,T) > c(1:length(foo))[foo][1] [1] 3 > And if there is no 'T', it returns 'NA' > foo <- c(F, F) > c(1:length(foo))[foo][1] [1] NA Martina -- D

Re: [R] how to find the location of the first TRUE of a logicalvector

2003-03-05 Thread Roger Peng
Try, x <- c(F,F,F,T,F,T,F,T) min(which(x)) -roger ___ UCLA Department of Statistics [EMAIL PROTECTED] http://www.stat.ucla.edu/~rpeng On Wed, 5 Mar 2003, Jason Liao wrote: > without having to check the vector element by element? Thanks a lot! > > Jason > > = >

Re: [R] reserved words documentation

2003-03-05 Thread Peter Dalgaard BSA
Robin Hankin <[EMAIL PROTECTED]> writes: > Come to think of it, the only place I could find > documentation for "..." was in Notes on R. > > Where is the best place to look for docs on "..1" ? In the source code, I suppose. It's extremely obscure and all you really need to know is that the .

RE: [R] how to find the location of the first TRUE of a logicalvector

2003-03-05 Thread J.R. Lockwood
> > > >without having to check the vector element by element? Thanks a lot! which.max() will coerce the logical to numeric and give the location of the first max, which is the first TRUE. J.R. Lockwood 412-683-2300 x4941 [EMAIL PROTECTED] http://www.rand.org/methodology/stat/members/lockwood/ __

Re: [R] how to find the location of the first TRUE of a logicalvector

2003-03-05 Thread Spencer Graves
Also: which(lv == TRUE)[1] Spencer Graves Marc Schwartz wrote: -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Jason Liao Sent: Wednesday, March 05, 2003 3:36 PM To: [EMAIL PROTECTED] Subject: [R] how to find the location of the first TRUE of a logic

RE: BSOD with ESS[R] under win2000

2003-03-05 Thread Simon . Gatehouse
Perhaps unrelated but for what it may be worth. Like many, I fiddle while thinking. Part of my fiddling has been to rapidly resize the R consule window back and forth by dragging with the mouse on the bottom right hand corner. I resize the window by a small amount rapidly and continually . After

[R] loop avoiding on time interval intersects

2003-03-05 Thread Olivier Collignon
I am trying to optimize some code to take advantage of R loop-avoiding capabilities when working on vectors/arrays that contain time intervals. The calculation involves adding (for each time interval) the time portion (of events defined by their start and end times) that elapsed during time interv

Re: [R] rmutil??

2003-03-05 Thread Peter Dalgaard BSA
"RenE J.V. Bertin" <[EMAIL PROTECTED]> writes: > The search function on www.r-project.org returns a certain number of > references to packages that can no longer be found on CRAN, or so it > would seem. I got interested in finterp(), from the package rmutil. > What happened to that package, or the

Re: [R] for loop problem

2003-03-05 Thread Michael Na Li
On Tue, 04 Mar 2003, Jeremy Z. Butler told this: > I want to generate a sequence which goes 1 2 3 4 5 6 7 8 14 15 16 17 18 19 > 20 21 26 27 ... i.e. 8 consecutive numbers then 5 missed then the next 8 > numbers etc. I was going to do this using the seq() function but couldn't > figure out ho

RE: [R] problem with cclust[er] package

2003-03-05 Thread ripley
I was referring to section 7.4 How do I debug code that I have compiled and dyn.load-ed? On Wed, 5 Mar 2003, Igor Oleinik wrote: > I have checked that section already. > Sorry, I should have mentioned that. > > Memory limit increase does not work. > Installtion of msvcrt.dll does not work > e

[R] Timezones

2003-03-05 Thread Adrian Trapletti
Can anybody give me a hint why as.POSIXlt doesn't recognize the same timezones that zdump knows about (Linux Suse 8.1 and Suse 7.3)? Is there a workaround? R : Copyright 2002, The R Development Core Team Version 1.6.1 (2002-11-01) R is free software and comes with ABSOLUTELY NO WARRANTY. You are

RE: BSOD with ESS[R] under win2000

2003-03-05 Thread ripley
That's bug PR#1711 in the R-bugs database. On Thu, 6 Mar 2003 [EMAIL PROTECTED] wrote: > Perhaps unrelated but for what it may be worth. > > Like many, I fiddle while thinking. Part of my fiddling has been to rapidly > resize the R consule window back and forth by dragging with the mouse on th