Re: [R] initial values for alpha and beta in Gamma inverse

2010-12-02 Thread Prof Brian Ripley
See the 'start' argument to glm(). (You have not told us what most of the words in your subject line mean, and I've guessed that c(alpha, beta) are the coefficients in the linear predictor.) On Thu, 2 Dec 2010, Rosario Garcia Gil wrote: Hello I am trying to fit a model using glm function w

Re: [R] colname refered by a variable

2010-12-02 Thread Santosh Srinivas
try this .. df[,colnames(df)==paste("A","C",sep="")] On Fri, Dec 3, 2010 at 12:05 PM, Yuan Jian wrote: > Hello, > > I tried to use a variable to refer colname, but I got error, could anyone > give me advice? > >>df=data.frame(cbind(AB=1:3,AC=3:5)) >> df$AC > [1] 3 4 5 >> df$paste("A","C",sep=""

[R] colname refered by a variable

2010-12-02 Thread Yuan Jian
Hello,   I tried to use a variable to refer colname, but I got error, could anyone give me advice?   >df=data.frame(cbind(AB=1:3,AC=3:5)) > df$AC [1] 3 4 5 > df$paste("A","C",sep="") Error: attempt to apply non-function thanks Jian   [[alternative HTML version deleted]]

Re: [R] Strange problems with compiling dll

2010-12-02 Thread Romain Francois
Hello, Your question is more appropriate on the R-devel mailing list. Le 03/12/10 00:41, Oleksandr Dyklevych a écrit : Dear sir\madam! I'm trying to speed up my R code by writing quite simple dll's in C. But I faced some problems, and I cannot determine their source. #include SEXP mycombi

Re: [R] Error using Rcpp under windows xp

2010-12-02 Thread Romain Francois
Hello randomcz, Thank you for your interrest in Rcpp. Rcpp has its own mailing list. http://lists.r-forge.r-project.org/cgi-bin/mailman/listinfo/rcpp-devel Please subscribe and report your question there. People will be happy to help you. Romain Le 03/12/10 03:57, randomcz a écrit : Hi, I

Re: [R] using ``<-'' in function argument

2010-12-02 Thread Berwin A Turlach
On Thu, 2 Dec 2010 23:34:02 -0500 David Winsemius wrote: > [...] Erik is telling you that your use of ncol<-4 got evaluated to > 4 and that the name of the resulting object was ignored, howevert the > value of the operation was passed on to matrix which used positional > matching since "=" was no

[R] Error using Rcpp under windows xp

2010-12-02 Thread randomcz
Hi, I am a newbie to Rcpp packages, and got problems in having basic set-ups for Rcpp under windows xp. Here is the list I have done. 1) installed Rtools and have no problem in compiling .c file. 2) installed Rcpp packages 3) set enviroment variables 'path' to make C:\Program Files\R\R-2.12.0\

Re: [R] Replacing a period in a string

2010-12-02 Thread Earl F Glynn
What about this? Remove the periods and change the "," to a ".": s <- "12.084.547,17" x <- as.numeric(gsub(',','\\.', gsub('\\.','',s))) options(digits=10) x Escaping periods is not-so-obvious. efg Earl F Glynn Overland Park, KS Luis Felipe Parra wrote: Hello I have a sting of the form "12

Re: [R] using ``<-'' in function argument

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 10:47 PM, Erik Iverson wrote: On 12/02/2010 09:35 PM, Jinsong Zhao wrote: Hi there, In function, it's usually using ``='' to assign default value for function argument. For newbie, it's possible to using ``<- '' to assign value for function argument. Although it's not a

Re: [R] Replacing a period in a string

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 10:46 PM, Luis Felipe Parra wrote: Hello I have a sting of the form "12.084.547,17" which I would like R to understand as a number which has "," as the decimal separator, does anybody know how to do this? If that is in a file then read.csv2 is the answer. If it is in a

Re: [R] Writing to a file

2010-12-02 Thread Jorge Ivan Velez
Hi Thomas, If "x" contains your current results, one way to do what you want is the following: # data x <- read.table(textConnection("X2403,0.006049271 X2403,0.000118622 X2403,50.99600705 X2403,7.62E-150 X2419,0.012464215 X2419,9.07E-05 X2419,137.4022573 X2419,6.45E-273"), sep = ",") closeAllConn

[R] Writing to a file

2010-12-02 Thread Thomas Parr
From: Thomas Parr [mailto:thomas.p...@maine.edu] Sent: Thursday, December 02, 2010 10:52 PM To: r-help-requ...@stat.math.ethz.ch Subject: Writing to a file I am trying to get my script to write to a file from the for loop. It is "working", but the problem is at it is outputting to two columns an

[R] Replacing a period in a string

2010-12-02 Thread Luis Felipe Parra
Hello I have a sting of the form "12.084.547,17" which I would like R to understand as a number which has "," as the decimal separator, does anybody know how to do this? thank you Felipe Parra [[alternative HTML version deleted]] __ R-help@r-p

Re: [R] The behaviour of read.csv().

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 9:33 PM, Duncan Murdoch wrote: On 02/12/2010 9:18 PM, David Winsemius wrote: On Dec 2, 2010, at 8:33 PM, Duncan Murdoch wrote: snipped I think the fill=TRUE option arrived about 10 years ago, in R 1.2.0. The comment in the NEWS file suggests it was in response to some st

Re: [R] using ``<-'' in function argument

2010-12-02 Thread Erik Iverson
On 12/02/2010 09:35 PM, Jinsong Zhao wrote: Hi there, In function, it's usually using ``='' to assign default value for function argument. For newbie, it's possible to using ``<- '' to assign value for function argument. Although it's not a correct way, R don't give any warning message. > matr

[R] using ``<-'' in function argument

2010-12-02 Thread Jinsong Zhao
Hi there, In function, it's usually using ``='' to assign default value for function argument. For newbie, it's possible to using ``<- '' to assign value for function argument. Although it's not a correct way, R don't give any warning message. > matrix(1:20, ncol <- 4) [,1] [,2] [,3] [,

Re: [R] The behaviour of read.csv().

2010-12-02 Thread Rolf Turner
On 3/12/2010, at 3:48 PM, David Scott wrote: > On 03/12/10 14:33, Duncan Murdoch wrote: >> I think the fill=TRUE option arrived about 10 years ago, in R 1.2.0. >> The comment in the NEWS file suggests it was in response to some strange >> csv file coming out of Excel. >> >> The real

Re: [R] The behaviour of read.csv().

2010-12-02 Thread David Scott
On 03/12/10 14:33, Duncan Murdoch wrote: On 02/12/2010 8:04 PM, Peter Ehlers wrote: On 2010-12-02 16:26, Rolf Turner wrote: On 3/12/2010, at 1:08 PM, Phil Spector wrote: Rolf - I'd suggest using junk<- read.csv("junk.csv",header=TRUE,fill=FALSE) if you don't want the behaviour

Re: [R] The behaviour of read.csv().

2010-12-02 Thread Duncan Murdoch
On 02/12/2010 9:18 PM, David Winsemius wrote: On Dec 2, 2010, at 8:33 PM, Duncan Murdoch wrote: snipped I think the fill=TRUE option arrived about 10 years ago, in R 1.2.0. The comment in the NEWS file suggests it was in response to some strange csv file coming out of Excel. The real problem

Re: [R] The behaviour of read.csv().

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 8:33 PM, Duncan Murdoch wrote: snipped I think the fill=TRUE option arrived about 10 years ago, in R 1.2.0. The comment in the NEWS file suggests it was in response to some strange csv file coming out of Excel. The real problem with the CSV format is that there really

Re: [R] Tinn-R 2.3.7.0 released

2010-12-02 Thread Frank Black
Nice, but I'm still finding the same bug when communicating between R and Tinn-R: source(.trPaths[5], echo=TRUE, max.deparse.length=150) So I still have to use the last version of Tinn-R which doesn't have that problem (Tinn-R 1.19.4.7). Emili 2010/11/22 Jose Claudio Faria > Dears users, > >

[R] Strange problems with compiling dll

2010-12-02 Thread Oleksandr Dyklevych
Dear sir\madam! I'm trying to speed up my R code by writing quite simple dll's in C. But I faced some problems, and I cannot determine their source. #include SEXP mycombin(SEXP N, SEXP k){ int i, *j, *l, c; j = INTEGER(k);l = INTEGER(N); c = 1; if(j[0] > 0 && j[0] < l[0]){

[R] Downloading a .csv through a .jsp url with variable parameters - R code or package?

2010-12-02 Thread Arsenio Staer
Dear R experts, I'm trying to download a .csv file with daily data on the companies through a javascript url ending in .jsp of the following form: http://... .com/.../.../filename.jsp?y=2004&m=3&d=9 where y = year, m = month and d=day. Accessing the link gives you the .csv for that date. I wa

Re: [R] The behaviour of read.csv().

2010-12-02 Thread Rolf Turner
On 3/12/2010, at 2:04 PM, Peter Ehlers wrote: > Rolf, > This is not to argue with your point re counter-intuitive, > but I always run a count.fields() first if I haven't seen > (or can't easily see) the file in my editor. I must have > learned that the hard way a long time ago. Sound

Re: [R] The behaviour of read.csv().

2010-12-02 Thread Duncan Murdoch
On 02/12/2010 8:04 PM, Peter Ehlers wrote: On 2010-12-02 16:26, Rolf Turner wrote: On 3/12/2010, at 1:08 PM, Phil Spector wrote: Rolf - I'd suggest using junk<- read.csv("junk.csv",header=TRUE,fill=FALSE) if you don't want the behaviour you're seeing. The point is not that I d

Re: [R] The behaviour of read.csv().

2010-12-02 Thread Peter Ehlers
On 2010-12-02 16:26, Rolf Turner wrote: On 3/12/2010, at 1:08 PM, Phil Spector wrote: Rolf - I'd suggest using junk<- read.csv("junk.csv",header=TRUE,fill=FALSE) if you don't want the behaviour you're seeing. The point is not that I don't want this kind of behaviour. The point is

Re: [R] The behaviour of read.csv().

2010-12-02 Thread Rolf Turner
On 3/12/2010, at 1:08 PM, Phil Spector wrote: > Rolf - >I'd suggest using > > junk <- read.csv("junk.csv",header=TRUE,fill=FALSE) > > if you don't want the behaviour you're seeing. The point is not that I don't want this kind of behaviour. The point is that it seems to me to be unexpe

[R] help with lme random = syntax and groupedData syntax

2010-12-02 Thread Huso, Manuela
Hello, all, I have a fairly complicated experimental design and would really appreciate some help on correctly specifying my random effects. I have a CRD split plot design with one covariate measured on the whole plot unit, one on the subplot unit and 2 other covariates measured on the subsam

Re: [R] The behaviour of read.csv().

2010-12-02 Thread Phil Spector
Rolf - I'd suggest using junk <- read.csv("junk.csv",header=TRUE,fill=FALSE) if you don't want the behaviour you're seeing. - Phil Spector Statistical Computing Facility

[R] The behaviour of read.csv().

2010-12-02 Thread Rolf Turner
I have recently been bitten by an aspect of the behaviour of the read.csv() function. Some lines in a (fairly large) *.csv file that I read in had too many entries. I would have hoped that this would cause read.csv() to throw an error, or at least issue a warning, but it read the file without co

[R] kmeans() compared to PROC FASTCLUS

2010-12-02 Thread Andrew Agrimson
Hello all, I've been comparing results from kmeans() in R to PROC FASTCLUS in SAS and I'm getting drastically different results with a real life data set. Even with a simulated data set starting with the same seeds with very well seperated clusters the resulting cluster means are still different.

Re: [R] Integral of PDF

2010-12-02 Thread Albyn Jones
On Thu, Dec 02, 2010 at 06:23:45PM -0500, Ravi Varadhan wrote: > A simple solution is to locate the mode of the integrand, which should be > quite easy to do, and then do a coordinate shift to that point and then > integrate the mean-shifted integrand using `integrate'. > > Ravi. Translation: t

Re: [R] Arrange elements on a matrix according to rowSums + short 'apply' Q

2010-12-02 Thread Petr Savicky
On Thu, Dec 02, 2010 at 01:13:40PM -0800, Aaron Polhamus wrote: ... > Many thanks for the tips, those solved my queries. Still interested in how > to force custom functions to work over rows rather than columns when using > apply, In the command TMAT <- apply(MAT, 1, function(X) X/sum(X)) the cu

Re: [R] Integral of PDF

2010-12-02 Thread Ted Harding
Albyn's reply is in line with an hypothesis I was beginning to formulate (without looking at the underlying FoRTRAN code), prompted by the hint in '?integrate': Details: If one or both limits are infinite, the infinite range is mapped onto a finite interval. For a finite interval,

Re: [R] Integral of PDF

2010-12-02 Thread Ravi Varadhan
But that only postpones the misery, Hans Werner! You can always make the mean large enough to get a wrong answer from `integrate'. integrate(function(x) dnorm(x, 700,50), -Inf, Inf, subdivisions=500, rel.tol=1e-11) integrate(function(x) dnorm(x, -700,50), -Inf, Inf,

Re: [R] Minor warning about seq

2010-12-02 Thread Carl Witthoft
I believe the R intro manual and R-inferno have some pretty stern warnings about never using 'c' or 't' as variable names, for obvious reasons. Similarly, I nearly crushed some code once by writing a nice little function to find the mode of a data set and calling the function "mode()" . (co

Re: [R] Integral of PDF

2010-12-02 Thread William Dunlap
You can use trace() to see what is happening > trace(dnorm, quote(print(round(x > integrate(function(x) dnorm(x, 500,50), -Inf, Inf) Tracing dnorm(x, 500, 50) on entry [1] 1 233 0 38 0 14 0 7 0 4 0 2 0 2 1 Tracing dnorm(x, 500, 50) on entry [1] -1 -2330 -38

[R] initial values for alpha and beta in Gamma inverse

2010-12-02 Thread Rosario Garcia Gil
Hello I am trying to fit a model using glm function with family=Gamma(link="inverse"). Is it possible to give initial values, and how? I tried to search for info but not managed to get any answer. Kind regards and thanks in advance. Rosario [[alternative HTML version deleted]] ___

Re: [R] Integral of PDF

2010-12-02 Thread Albyn Jones
To really understaand it you will have to look at the fortran code underlying integrate. I tracked it back through a couple of layers (dqagi, dqagie, ... just use google, these are old netlib subroutines) then decided I ought to get back to grading papers :-) It looks like the integral is split

Re: [R] latex tables for 3+ dimensional tables/arrays

2010-12-02 Thread RICHARD M. HEIBERGER
Michael, I think this is what you are looking for. Rich library(Hmisc) tmp <- array(rnorm(60), c(3,4,5), list(letters[1:3],LETTERS[4:7],letters[8:12])) ## latex(tmp) ftable(tmp) dviname <- latex(ftable(tmp)) ft <- ftable(tmp) dviname <- latex(ft, colheads=attr(ft,"col.vars")[[1

Re: [R] Integral of PDF

2010-12-02 Thread Hans W Borchers
You can dive into the thread "puzzle with integrate over infinite range" from September this year. The short answer appears to be: Increase the error tolerance. integrate(function(x) dnorm(x, 500,50), -Inf, Inf, subdivisions=500, rel.tol=1e-11) # 1 with absolute error < 1.1e

Re: [R] Tukey Test, lme, error: less than two groups

2010-12-02 Thread Steven McKinney
Comments in-line below > -Original Message- > From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] On > Behalf Of Lilith > Sent: December-02-10 9:39 AM > To: r-help@r-project.org > Subject: [R] Tukey Test, lme, error: less than two groups > > > Dear R-group, > > I a

Re: [R] Arrange elements on a matrix according to rowSums + short 'apply' Q

2010-12-02 Thread Aaron Polhamus
Ivan and Michael, Many thanks for the tips, those solved my queries. Still interested in how to force custom functions to work over rows rather than columns when using apply, but the MAT/rowSums(MAT) technique is definitely the most efficient way to go for this application. Cheers, Aaron 2010/12

Re: [R] Filter data

2010-12-02 Thread Mike Rennie
Try looking at subset()... I typically use this when I'm trying to isolate specific cases from a data frame. Also, Dalgaard's introductory R book has some great examples for parsing data in the manner you're attempting you might want to look at that. Mike On Thu, Dec 2, 2010 at 2:08 PM, Dioge

Re: [R] Filter data

2010-12-02 Thread mohamed . lajnef
Hi Diogenas, Try this, data<-subset(poli, poli$year>1994) Best, M Diogenas a écrit : Hello, I understand that question is probably stupid, but ... I have data (polity IV index) "country","year","democ","autoc","polity","polity2" "1","Afghanistan ",1800,1,7,-6,-6 "2","Afghanista

Re: [R] latex tables for 3+ dimensional tables/arrays

2010-12-02 Thread Michael Friendly
On 12/2/2010 4:04 PM, David Winsemius wrote: ?latex # yes I know you are aware of this but it seemed as though you hadn't read its help page. # Attached is the output on my device from the following command: latexVerbatim( ftable(UCB)) Perhaps I should have been more explicit. I can always

[R] parLapply - Error in do.call("fun", lapply(args, enquote)) : could not find function "fun"

2010-12-02 Thread Adrienne Wootten
Hello everybody, I've got a bit of a problem with parLapply that's left me scratching my head today. I've tried this in R 2.11 and the 23 bit Revolution R Enterprise and gotten the same result, OS in question is Windows XP, the package involved is the snow package. I've got a list of 20 rain/no

Re: [R] Significance of the difference between two correlation coefficients

2010-12-02 Thread Norm Matloff
Adaikalavan Ramasamy wrote: > Using the info from that website, I can code up the following to give > the two-tailed p-value of difference in correlations: > > diff.corr <- function( r1, n1, r2, n2 ){ > ... William Revelle also mentioned the r.test in the psych package. I would add here that

Re: [R] MANOVA Type III SS

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 4:18 PM, Ali S wrote: How do I get MANOVA results with Type III sums of squares? First pull on your asbestos underwear, then visit : http://search.r-project.org/cgi-bin/namazu.cgi?query=type+III+SS&max=100&result=normal&sort=score&idxname=functions&idxname=Rhelp08&idxname

[R] Integral of PDF

2010-12-02 Thread Doran, Harold
The integral of any probability density from -Inf to Inf should equal 1, correct? I don't understand last result below. > integrate(function(x) dnorm(x, 0,1), -Inf, Inf) 1 with absolute error < 9.4e-05 > integrate(function(x) dnorm(x, 100,10), -Inf, Inf) 1 with absolute error < 0.00012 > integr

[R] MANOVA Type III SS

2010-12-02 Thread Ali S
How do I get MANOVA results with Type III sums of squares? [[alternative HTML version deleted]] __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting guide http://www.R-project.org/p

Re: [R] problem with package rsm: running fit.mult.impute with cph

2010-12-02 Thread Frank Harrell
rms and fit.mult.impute don't necessarily play well with mice. Note also that you will need a special adjustment for variances for having done stepwise regression. One approach is to insert a zero for a coefficient every time that variable is not 'selected', then compute the sample variance of t

Re: [R] Filter data

2010-12-02 Thread Diogenas
Simplified version of str(poli): (real dataset includes 36 variables) $ country : chr [1:15846] "Afghanistan " "Afghanistan " "Afghanistan " "Afghanistan " ... $ year: num [1:15846] 1800 1801 1802 1803 1804 ... $ democ : num [1:15846] 1 1 1

Re: [R] latex tables for 3+ dimensional tables/arrays

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 3:47 PM, Michael Friendly wrote: I'm looking for an R method to produce latex versions of tables for table/array objects of 3 or more dimensions, which, of necessity is flattened to a 2D display, for example with ftable(), or vcd::structable, as shown below. I'd be happy

Re: [R] Filter data

2010-12-02 Thread Nordlund, Dan (DSHS/RDA)
> -Original Message- > From: r-help-boun...@r-project.org [mailto:r-help-boun...@r- > project.org] On Behalf Of Diogenas > Sent: Thursday, December 02, 2010 12:09 PM > To: r-help@r-project.org > Subject: [R] Filter data > > > Hello, > I understand that question is probably stupid, but ...

[R] latex tables for 3+ dimensional tables/arrays

2010-12-02 Thread Michael Friendly
I'm looking for an R method to produce latex versions of tables for table/array objects of 3 or more dimensions, which, of necessity is flattened to a 2D display, for example with ftable(), or vcd::structable, as shown below. I'd be happy to settle for a flexible solution for the 3D case. > UCB

[R] Женская логика

2010-12-02 Thread Vovan
Хотите понимать женщин? Знать реальные их мысли, когда они пытаются спрятать их за совершенно отвлеченными речами? На практических тренингах Академии Знакомств

[R] Женская логика

2010-12-02 Thread Vovan
Хотите понимать женщин? Знать реальные их мысли, когда они пытаются спрятать их за совершенно отвлеченными речами? На практических тренингах Академии Знакомств

[R] Женская логика

2010-12-02 Thread Vovan
Хотите понимать женщин? Знать реальные их мысли, когда они пытаются спрятать их за совершенно отвлеченными речами? На практических тренингах Академии Знакомств

[R] Женская логика

2010-12-02 Thread Vovan
Хотите понимать женщин? Знать реальные их мысли, когда они пытаются спрятать их за совершенно отвлеченными речами? На практических тренингах Академии Знакомств

[R] Женская логика

2010-12-02 Thread Vovan
Хотите понимать женщин? Знать реальные их мысли, когда они пытаются спрятать их за совершенно отвлеченными речами? На практических тренингах Академии Знакомств

[R] Женская логика

2010-12-02 Thread Vovan
Хотите понимать женщин? Знать реальные их мысли, когда они пытаются спрятать их за совершенно отвлеченными речами? На практических тренингах Академии Знакомств

[R] Filter data

2010-12-02 Thread Diogenas
Hello, I understand that question is probably stupid, but ... I have data (polity IV index) "country","year","democ","autoc","polity","polity2" "1","Afghanistan ",1800,1,7,-6,-6 "2","Afghanistan ",1801,1,7,-6,-6 "3","Afghanistan ",1802,1,7,-6,-6 I need to crea

[R] Extreme value probabilities

2010-12-02 Thread Sarah Henderson
Greetings to all -- I have a set of ~1300 radon measurements from homes across British Columbia in Canada. We have split these measurements into five groups according the the tectonic belt in which they fall, with N ranging from ~160 to ~600 measurements per group. The values are roughly log-nor

Re: [R] StatET: Connecting to a remote rterm instance

2010-12-02 Thread Tobias Verbeke
Dear WanderingWizard, On 12/02/2010 07:58 PM, WanderingWizard wrote: Is it possible to use Eclipse (StatET) to connect to an rterm instance running on another computer? Yes. You can launch, disconnect and reconnect to a remote R console. It looks like it should be easy, but when I select an

[R] StatET: Connecting to a remote rterm instance

2010-12-02 Thread WanderingWizard
Is it possible to use Eclipse (StatET) to connect to an rterm instance running on another computer? It looks like it should be easy, but when I select an R Engine it says "Connection failed to: hostname" everytime. Is there a guide somewhere? -- View this message in context: http://r.789695.n

Re: [R] Suitable test for ordinal variable vs continuous variable trend

2010-12-02 Thread Greg Snow
There are many possibilities depending on what you are really looking for (strict increasing, vs. increasing or constant, vs. general trend, etc.) I would start with a plot of the data, that may result in a significant interocular concussion test and will at least help you understand what is ha

[R] Tukey Test, lme, error: less than two groups

2010-12-02 Thread Lilith
Dear R-group, I am trying desperately to get this Tukey test working. Its my first time here so I hope my question is not too stupid, but I couldn't find anything helpful in the help or in the forum. I am analysing a dataset of treated grasses. I want to find out, if the grasses from different P

[R] openNLP package error

2010-12-02 Thread Sascha Wolfer
Hello list, I seem to have a problem with the openNLP package, I'm actually stuck in the very beginning. Here's what I did: > install.packages("openNLP") > install.packages("openNLPmodels.de", repos = "http://datacube.wu.ac.at/";, type = "source") > library(openNLPmodels.de) > library(openNL

[R] Hmisc label function applied to data frame

2010-12-02 Thread Krishna Tateneni
Hello, I'm attempting to create a data frame with correlations between every pair of variables in a data frame, so that I can then sort by the value of the correlation coefficient and see which pairs of variables are most strongly correlated. The sm2vec function in the corpcor library works very

[R] Tukey Test after lme, error: less than two groups

2010-12-02 Thread Lilith Epperlein
Dear R-group, I am trying desperately to get this Tukey test working. Its my first time here so I hope my question is not too stupid, but I couldn't find anything helpful in the help or in the forum. I am analysing a dataset of treated grasses. I want to find out, if the grasses from different

Re: [R] 2D Random walk

2010-12-02 Thread jim holtman
Here is a use of color to show what the path is and following up on Patrick's post to make the code a little more efficient: # compute path n <- 1 rw <- matrix(0, ncol = 2, nrow = n) # generate the indices to set the deltas indx <- cbind(seq(n), sample(c(1, 2), n, TRUE)) # now set the values

Re: [R] procrustes results affected by order of sites in input file

2010-12-02 Thread Christine Dolph
Hi, Thanks very much for your response. Unfortunately, using the set.seed() call does not seem to solve my problem. If I do not use set.seed(), I do indeed get some small differences in protest() results due to the effect of random starts. But with my sites in a given order in the input files, and

Re: [R] attempted merge() returns: cannot coerce type 'closure' to vector of type 'any'

2010-12-02 Thread Karl Brand
Cheers Bill, Thank you for the clarificaiton. Prabably showing the str() of these objects would have made it easier for you see exatly where i was going wrong. Which as David pointed out, was really a lack of ?merge reading...:) Karl On 12/2/2010 5:46 PM, William Dunlap wrote: I didn't cha

Re: [R] Help summarizing R data frame

2010-12-02 Thread Henrique Dallazuanna
Try this: with(DF, rowsum(quantity, identifier)) On Thu, Dec 2, 2010 at 2:24 PM, chris99 wrote: > > I am trying to aggregate data in column 2 to identifiers in col 1 > > eg.. > > take this> > > identifier quantity > 1 10 > 1 20 > 2

Re: [R] Help summarizing R data frame

2010-12-02 Thread jim holtman
Nice thing about R is there are a number of ways to do things: > x identifier quantity 1 1 10 2 1 20 3 2 30 4 1 15 5 2 10 6 3 20 > require(sqldf) > sqldf('select identifier, sum(quantity) as quantity from x

Re: [R] 2D Random walk

2010-12-02 Thread Patrick Burns
Hopefully someone has a good suggestion for your question. I'd just like to point out that the generation of the random walk is pretty much optimized for worst performance. A 'for' loop is not necessary and growing the objects could be a very significant drag. See Circles 2 and 3 of 'The R Infe

Re: [R] Help summarizing R data frame

2010-12-02 Thread Patrick Hausmann
Here are some examples with tapply, aggregate, ddply: x <- read.table("clipboard", head=TRUE) with(x, tapply(quantity, identifier, sum)) aggregate(x$quantity, by=list(x$identifier), sum) aggregate(quantity ~ identifier, data = x, sum) library(plyr) ddply(x, .(identifier), summarise, quantity=

Re: [R] Help summarizing R data frame

2010-12-02 Thread Mike Rennie
see also tapply() e.g. a<-c(1,1,1,2,2,2,3,3,3) b<-c(10,10,10,15,15,15,20,20,20) c.dat<-data.frame(a,b) tapply(c.dat[,2],c.dat[,1],sum) Mike On Thu, Dec 2, 2010 at 10:33 AM, Ivan Calandra wrote: > see ?aggregate, and ?summaryBy (in package doBy) > I think ddply (in package plyr) could also do

Re: [R] attempted merge() returns: cannot coerce type 'closure' to vector of type 'any'

2010-12-02 Thread William Dunlap
I didn't change your "rownames" to "row.names" because I figured you had the name you wanted but only forgot to include the quotes. Both "rownames" and "row.names" are valid inputs, but they mean different things. Howver, without the quotes you were passing in the contents of the object called ro

Re: [R] Help summarizing R data frame

2010-12-02 Thread Ivan Calandra
see ?aggregate, and ?summaryBy (in package doBy) I think ddply (in package plyr) could also do the job Ivan Le 12/2/2010 17:24, chris99 a écrit : I am trying to aggregate data in column 2 to identifiers in col 1 eg.. take this> identifier quantity 1 10 1

[R] Kalman filter

2010-12-02 Thread Santiago Ramos
I can say is used as filter Kalman thanks Cordialmente, JAVIER SANTIAGO PARRA RAMOS INGENIERO DE SISTEMAS ESP. EN GERENCIA DE SISTEMAS INFORMATICOS CEL: (57) 313 416 71 21 [[alternative HTML version deleted]] ___

[R] 2D Random walk

2010-12-02 Thread featherbox
I've wrote some code to simulate a random walk in 2 dimensions on a lattice. Basically I want to add something in to make it plot it point by point so you can see what is going on. Heres my code for the random walk in 2d RW2D<-function(N) { i<-0 xdir<-0 ydir<-0 xpos<-vector()

Re: [R] Please help......barplot2

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 11:10 AM, David Lyon wrote: Thanks David Do you have the url link that details the worked solution to my problem: "that we have an extensive collection of documentation suitable for beginners that probably has similar problems worked out:" http://cran.r-project.org/o

[R] Help summarizing R data frame

2010-12-02 Thread chris99
I am trying to aggregate data in column 2 to identifiers in col 1 eg.. take this> identifier quantity 1 10 1 20 2 30 1 15 2 10 3 20 and make this> identifier q

Re: [R] attempted merge() returns: cannot coerce type 'closure' to vector of type 'any'

2010-12-02 Thread Karl Brand
On 12/2/2010 3:52 PM, David Winsemius wrote: On Dec 2, 2010, at 5:58 AM, Karl Brand wrote: On 12/2/2010 11:36 AM, David Winsemius wrote: On Dec 2, 2010, at 5:22 AM, Karl Brand wrote: Cheers Bill. Inserting earlier debris: I don't understand why i get this error message when attem

Re: [R] Please help......barplot2

2010-12-02 Thread David Lyon
Thanks David Do you have the url link that details the worked solution to my problem: "that we have an extensive collection of documentation suitable for beginners that probably has similar problems worked out:" If not can someone show me how to " How do I import the file, then plot the mean a

[R] Odp: Please help......barplot2

2010-12-02 Thread Petr PIKAL
Hi r-help-boun...@r-project.org napsal dne 02.12.2010 16:36:09: > Hi everyone > > I spent hours trying to figure this out but as a newbie I am stuck... > can someone show me the R code for the following: > > If I had a tab delimited file called "file", containing 3 rows : > 9.56 8.67 9.28

Re: [R] Please help......barplot2

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 10:36 AM, David Lyon wrote: Hi everyone I spent hours trying to figure this out but as a newbie I am stuck... can someone show me the R code for the following: If I had a tab delimited file called "file", Are you sure that you are not on an OS that hides the file exten

[R] plot more plots from one matrix

2010-12-02 Thread alcesgabbo
Hi, I have a dataframe like this: procedure propertysensor_data sensor_date | | | | [1,] "PAT_Laser_2" "Distance" "30.42" "2010-09-30T15:00:12+0200" [2,] "PAT_Laser_2" "Distance" "31.22" "2010-10

[R] initial values for alpha and beta in Gamma inverse

2010-12-02 Thread Rosario Garcia Gil
Hello I am trying to fit a model using glm function with family=Gamma(link="inverse"). Is it possible to give initial values, and how? I tried to search for info but not managed to get any answer. Kind regards and thanks in advance. Rosario [[alternative HTML version deleted]] ___

[R] make check from R2.12.0.exe installation

2010-12-02 Thread elliott harrison
Hi, I typically install new versions of R on windows using the downloadable executable file rather than the full tar. I need to now document the success of the installation in addition to my preferred procedure of running an old dataset against the new build. I found quickly that this is all av

Re: [R] Hmm Topology restriction

2010-12-02 Thread Kishor Tappita
Dear Ingmar, Thanks a lot. Regards, Kishor On Thu, Dec 2, 2010 at 6:39 PM, Ingmar Visser wrote: > depmixS4 enables linear constraints on parameters, best, Ingmar > > On Thu, Dec 2, 2010 at 12:01 PM, Kishor Tappita > wrote: >> >> Dear List, >> >> We are using RHmm to cluster data through HMM. W

[R] Please help......barplot2

2010-12-02 Thread David Lyon
Hi everyone I spent hours trying to figure this out but as a newbie I am stuck... can someone show me the R code for the following: If I had a tab delimited file called "file", containing 3 rows : 9.568.679.288.817.939.858.9210.19 8.63 6.367.296.687.

[R] Пикап

2010-12-02 Thread Vovan
Пикап блог один из лучший информативных сайтов о в Украине, который помогает мужчинам в разы улучшить их личную и сексуальную жизнь дает ответы на вопрос как поÐ

[R] Пикап

2010-12-02 Thread Vovan
Пикап блог один из лучший информативных сайтов о в Украине, который помогает мужчинам в разы улучшить их личную и сексуальную жизнь дает ответы на вопрос как поÐ

Re: [R] attempted merge() returns: cannot coerce type 'closure' to vector of type 'any'

2010-12-02 Thread David Winsemius
On Dec 2, 2010, at 5:58 AM, Karl Brand wrote: On 12/2/2010 11:36 AM, David Winsemius wrote: On Dec 2, 2010, at 5:22 AM, Karl Brand wrote: Cheers Bill. Inserting earlier debris: I don't understand why i get this error message when attempting to use merge() - > temp <- merge(x, y[,

[R] Пикап

2010-12-02 Thread Vovan
Пикап блог один из лучший информативных сайтов о в Украине, который помогает мужчинам в разы улучшить их личную и сексуальную жизнь дает ответы на вопрос как поÐ

[R] Пикап

2010-12-02 Thread Vovan
Пикап блог samec.org.ua один из лучший информативных сайтов о в Украине, который помогает мужчинам в разы улучшить их личную и сексуальную жизнь дает ответы на вопрос

Re: [R] How to call R-squared values from lm's?

2010-12-02 Thread Marc Schwartz
On Dec 2, 2010, at 8:15 AM, Wegan, Michael (DNRE) wrote: > I would like to call both p-values and R-squared values from lm's in a > function. I can get the p-values from coef(summary(name.lm))[r,c], however, > I cannot figure out how to call the R-squared values without manually calling > the

  1   2   >