Re: [R] rgl.snapshot() : no longer works?

2010-12-29 Thread Yihui Xie
Hi, Is there any progress so far? It seems R 2.12.1 under Windows still does not have the rgl.snapshot() support. Regards, Yihui -- Yihui Xie Phone: 515-294-2465 Web: http://yihui.name Department of Statistics, Iowa State University 2215 Snedecor Hall, Ames, IA On Tue, Nov 2, 2010 at 7:27 PM,

Re: [R] Writing a single output file

2010-12-29 Thread Amy Milano
Dear sir, At the outset I sincerely apologize for reverting back bit late as I was out of office. I thank you for your guidance extended by you in response to my earlier mail regarding "Writing a single output file" where I was trying to read multiple output files and create a single output dat

Re: [R] access a column of a dataframe without qualifying the name of the column

2010-12-29 Thread Bill.Venables
Here is an alternaive approach that is closer to that used by lm and friends. > df <- data.frame(x=1:10,y=11:20) > test <- function(col, dat) eval(substitute(col), envir = dat) > test(x, df) [1] 1 2 3 4 5 6 7 8 9 10 > test(y, df) [1] 11 12 13 14 15 16 17 18 19 20 > There is a slight a

Re: [R] icon for an R package

2010-12-29 Thread Michael Friendly
Wow! thanks John, David and Marc and Happy New Year to all R-helpRs -Michael On 12/29/2010 7:00 PM, John Fox wrote: Hi Michael, I've attached my attempt at an R-package logo. Best, John John Fox Senator William McMaster Professor of Social Statistics Dep

[R] Bivariate weighted fit methods of Williamson-York in R?

2010-12-29 Thread Jooil Kim
Hello everyone, I've been looking for an R function to calculate bivariate weighted fits of my data set, preferably using methods of Williamson-York. Improvements offered by using bivariate weighted fitting compared to conventional linear least-square fitting was recently described in a paper by

Re: [R] filling up holes

2010-12-29 Thread analys...@hotmail.com
On Dec 28, 10:27 pm, wrote: > Dear 'analyst41' (it would be a courtesy to know who you are) > > Here is a low-level way to do it.   > > First create some dummy data > > > allDates <- seq(as.Date("2010-01-01"), by = 1, length.out = 50) > > client_ID <- sample(LETTERS[1:5], 50, rep = TRUE) > > val

[R] Curso de R en Santiago, Chile

2010-12-29 Thread Jose Bustos Melo
Estimados, A todos quienes estan insterados y estan en Stgo de Chile les tengo una muy buena noticia. Desde hace ya algunas semanas, nos hemos sentado a la mesa con Alex (Epidemiologo) a discutir la necesidad de desarrollar un curso de R para principiantes. No solo porque es necesario unirse e

Re: [R] access a column of a dataframe without qualifying the name of the column

2010-12-29 Thread John Sorkin
Thank you, John John David Sorkin M.D., Ph.D. Chief, Biostatistics and Informatics University of Maryland School of Medicine Division of Gerontology Baltimore VA Medical Center 10 North Greene Street GRECC (BT/18/GR) Baltimore, MD 21201-1524 (Phone) 410-605-7119 (Fax) 410-605-7913 (Please call

Re: [R] access a column of a dataframe without qualifying the name of the column

2010-12-29 Thread John Sorkin
Thank you John John David Sorkin M.D., Ph.D. Chief, Biostatistics and Informatics University of Maryland School of Medicine Division of Gerontology Baltimore VA Medical Center 10 North Greene Street GRECC (BT/18/GR) Baltimore, MD 21201-1524 (Phone) 410-605-7119 (Fax) 410-605-7913 (Please call p

Re: [R] access a column of a dataframe without qualifying the name of the column

2010-12-29 Thread Bert Gunter
?substitute test <- function(col,frm) { eval(substitute(col),frm) } test2 <- function(col,frm){ cname<- deparse(substitute(col)) frm[[cname]] } z <- data.frame(x=1:3,y=letters[1:3]) test(x, z) test2(x, z) -- Bert On Wed, Dec 29, 2010 at 4:44 PM, David Winsemius wrote: > > On Dec 29,

Re: [R] logistic regression with response 0,1

2010-12-29 Thread Dennis Murphy
Hi: I think you created a problem for yourself in the way you generated your data. y<-rbinom(2000,1,.7) euro <- rnorm(2000, m = 300 * y + 50 * (1 - y), s = 20 * y + 12 * (1 - y)) # Create a 2000 x 2 matrix of probabilities prmat <- cbind(0.8 * y + 0.2 * (1 - y), 0.2 * y + 0.8 * (1 - y)) # sample

Re: [R] access a column of a dataframe without qualifying the name of the column

2010-12-29 Thread David Winsemius
On Dec 29, 2010, at 7:11 PM, John Sorkin wrote: I am trying to write a function that will access a column of a data frame without having to qualify the name of the data frame column as long as the name of the dataframe is passed to the function. As can be seen from the code below, my funct

[R] prediction intervals for (mcgv) gam objects

2010-12-29 Thread Julian
As I understand it,  predict.lm(l ,newdata=nd ,interval="confidence") yields confidence bands for the predicted mean of new observations and lm.predict(l ,newdata=nd ,interval="prediction") yields confidence bands for new observations themselves, given an lm object l.   However with regard to {m

[R] access a column of a dataframe without qualifying the name of the column

2010-12-29 Thread John Sorkin
I am trying to write a function that will access a column of a data frame without having to qualify the name of the data frame column as long as the name of the dataframe is passed to the function. As can be seen from the code below, my function is not working: df <- data.frame(x=1:10,y=11:20)

Re: [R] icon for an R package

2010-12-29 Thread John Fox
Hi Michael, I've attached my attempt at an R-package logo. Best, John John Fox Senator William McMaster Professor of Social Statistics Department of Sociology McMaster University Hamilton, Ontario, Canada web: socserv.mcmaster.ca/jfox > -Original Messag

Re: [R] subset question

2010-12-29 Thread Sarah Goslee
Details of *what* didn't work would be helpful, like for example error messages. Regardless, I'd do it like this: subd <- d[, d$gene %in% c("i1","i2","i3"), ] > d gene 1 2 3 1 i1 1 6 11 2 i5 2 7 12 3 i2 3 8 13 4 i3 4 9 14 5 i1 5 10 15 > d[d$gene %in% c("i1","i2","i3"), ] g

Re: [R] subset question

2010-12-29 Thread Jorge Ivan Velez
Hi Anjan, Try subset(d, gene %in% c("i1", "i2", "i3")) HTH, Jorge On Wed, Dec 29, 2010 at 4:55 PM, ANJAN PURKAYASTHA <> wrote: > Hi, > I'm having a problem with a step that should be pretty simple. > I have a dataframe, d, with column names : gene s1 s2 s3. The column > "gene" > stores an Id

Re: [R] subset question

2010-12-29 Thread ANJAN PURKAYASTHA
nope, that did not work. thanks though. Anjan On Wed, Dec 29, 2010 at 5:02 PM, Jonathan Flowers < jonathanmflow...@gmail.com> wrote: > Try subd <- d[, "gene" == c("i1","i2","i3")] > > On Wed, Dec 29, 2010 at 4:55 PM, ANJAN PURKAYASTHA < > anjan.purkayas...@gmail.com> wrote: > >> Hi, >> I'm having

Re: [R] How to create an array of lists of multiple components?

2010-12-29 Thread Gabor Grothendieck
On Wed, Dec 29, 2010 at 4:58 PM, Marius Hofert wrote: > Dear Jim, > > thanks for your quick response. Here is what I try to achieve: > > ## list containing some data > l <- list( >          list( >               list( >                    list(a = 1, b = "b", c = 2), >                    list(a =

Re: [R] Counting number of datasets and appending them

2010-12-29 Thread Jorge Ivan Velez
Hi Grace, Try something along the lines of do.call(rbind, lapply(1:maxi, function(x) get(paste('data', x, sep = "" HTH, Jorge On Wed, Dec 29, 2010 at 5:06 PM, Li, Grace <> wrote: > Hi there, > > I have a question on how to read a bunch of dataset, assign each of the > dataset to a matrix

[R] Counting number of datasets and appending them

2010-12-29 Thread Li, Grace
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

Re: [R] subset question

2010-12-29 Thread Jonathan Flowers
Try subd <- d[, "gene" == c("i1","i2","i3")] On Wed, Dec 29, 2010 at 4:55 PM, ANJAN PURKAYASTHA < anjan.purkayas...@gmail.com> wrote: > Hi, > I'm having a problem with a step that should be pretty simple. > I have a dataframe, d, with column names : gene s1 s2 s3. The column > "gene" > stores an

Re: [R] How to create an array of lists of multiple components?

2010-12-29 Thread Marius Hofert
Dear Jim, thanks for your quick response. Here is what I try to achieve: ## list containing some data l <- list( list( list( list(a = 1, b = "b", c = 2), list(a = 1, b = "b", c = 2), list(a = 1, b = "b", c = 2),

[R] subset question

2010-12-29 Thread ANJAN PURKAYASTHA
Hi, I'm having a problem with a step that should be pretty simple. I have a dataframe, d, with column names : gene s1 s2 s3. The column "gene" stores an Id; the rest of the columns store intensity data. I would like to extract the rows for gene Ids i1, i2, i3 ( I know a priori that those rows exis

Re: [R] Removing rows with earlier dates

2010-12-29 Thread William Dunlap
> -Original Message- > From: r-help-boun...@r-project.org > [mailto:r-help-boun...@r-project.org] On Behalf Of Ali Salekfard > Sent: Wednesday, December 29, 2010 6:25 AM > To: r-help@r-project.org > Subject: Re: [R] Removing rows with earlier dates > > Thanks to everyone. Joshua's respon

Re: [R] How to create an array of lists of multiple components?

2010-12-29 Thread jim holtman
Is this what you want: > n1 <- 2 > n2 <- 4 > n3 <- 5 > res <- array(rep(list(list(NULL,NULL,NULL)), n1*n2*n3), dim = c(n1,n2,n3)) > res[1,1,1] # is not a list with three components... [[1]] [[1]][[1]] NULL [[1]][[2]] NULL [[1]][[3]] NULL > str(res) List of 40 $ :List of 3 ..$ : NULL ..$ :

Re: [R] Trying to extract an algorithm from a function

2010-12-29 Thread David Winsemius
On Dec 29, 2010, at 3:31 PM, CALEF ALEJANDRO RODRIGUEZ CUEVAS wrote: Hi, I'm using package "vars" and I'm trying to extract the algorithm that function "predict" contained in that package in order to understand how does it work. When I type function "VAR" then all its algorithm appears in

Re: [R] icon for an R package

2010-12-29 Thread Marc Schwartz
On Dec 29, 2010, at 2:08 PM, Michael Friendly wrote: > On 12/29/2010 1:01 PM, Marc Schwartz wrote: >> Michael, >> Are you referring to an icon that would be displayed for an R package when >> browsing in a file manager, such as Nautilus, Konqueror or Finder? > Well, my initial query was just for

[R] Trying to extract an algorithm from a function

2010-12-29 Thread CALEF ALEJANDRO RODRIGUEZ CUEVAS
Hi, I'm using package "vars" and I'm trying to extract the algorithm that function "predict" contained in that package in order to understand how does it work. When I type function "VAR" then all its algorithm appears in R, however if I try to do the same with "predict" nothing happens...Is there

[R] How to create an array of lists of multiple components?

2010-12-29 Thread Marius Hofert
Hi, how can I create an array of lists of three components? This approach does not work: n1 <- 2 n2 <- 4 n3 <- 5 res <- array(rep(vector("list",3), n1*n2*n3), dim = c(n1,n2,n3)) res[1,1,1] # is not a list with three components... The goal is that res[1,1,1] is a list with three components. Also,

Re: [R] icon for an R package

2010-12-29 Thread Michael Friendly
On 12/29/2010 1:01 PM, Marc Schwartz wrote: Michael, Are you referring to an icon that would be displayed for an R package when browsing in a file manager, such as Nautilus, Konqueror or Finder? Well, my initial query was just for an icon that I could use in a presentation to represent several

Re: [R] Duplicated date values aren't duplicates

2010-12-29 Thread odocoileus55
Hi all, I am experiencing a similar issue with "non unique dates for a given burst". This is more of a practice session for me, I have data from 1 collared animal and for practice, assigned this individual 2 bursts (wk1 and wk2). This is what I have: ID DATETIME BURST X

Re: [R] icon for an R package

2010-12-29 Thread David Winsemius
Attached is a png file that is the superposition of an R logo and a Mac-ish package icon. Best I can do with my limited tools. On Dec 29, 2010, at 12:32 PM, Michael Friendly wrote: On 12/29/2010 11:02 AM, David Winsemius wrote: On Dec 29, 2010, at 10:03 AM, Michael Friendly wrote: I'm

Re: [R] icon for an R package

2010-12-29 Thread Marc Schwartz
On Dec 29, 2010, at 11:32 AM, Michael Friendly wrote: > On 12/29/2010 11:02 AM, David Winsemius wrote: >> >> On Dec 29, 2010, at 10:03 AM, Michael Friendly wrote: >> >>> I'm looking for an icon to represent an R package. Perhaps something >>> like >>> >>> http://cdn2.iconfinder.com/data/icon

[R] logistic regression with response 0,1

2010-12-29 Thread Federico Bonofiglio
Dear Masters, first I'd like to wish u all a great 2011 and happy holydays by now, second (here it come the boring stuff) I have a question to which I hope u would answer: I run a logistic regression by glm(), on the following data type (y1=1,x1=x1); (y2=0,x2=x2);..(yn=0,xn=xn), where the res

Re: [R] as.object: function doesn't exist but I wish it did

2010-12-29 Thread Uwe Ligges
Not sure what you really want, my best guess is you are looking for get(): best <- get(best) Uwe Ligges On 29.12.2010 18:31, Patrick McKann wrote: I seem to come to this problem alot, and I can find my way out of it with a loop, but I wish, and wonder if there is a better way. Here's an ex

Re: [R] as.object: function doesn't exist but I wish it did

2010-12-29 Thread Gabor Grothendieck
On Wed, Dec 29, 2010 at 12:31 PM, Patrick McKann wrote: > I seem to come to this problem alot, and I can find my way out of it with a > loop, but I wish, and wonder if there is a better way.  Here's an example > (lmer1-5 are a series of lmer objects): > >  bs=data.frame(bic=BIC(lmer1,lmer2,lmer3,l

Re: [R] icon for an R package

2010-12-29 Thread Michael Friendly
On 12/29/2010 11:02 AM, David Winsemius wrote: > > On Dec 29, 2010, at 10:03 AM, Michael Friendly wrote: > >> I'm looking for an icon to represent an R package. Perhaps something >> like >> >> http://cdn2.iconfinder.com/data/icons/DarkGlass_Reworked/128x128/apps/package.png >> >> >> >> but with

[R] as.object: function doesn't exist but I wish it did

2010-12-29 Thread Patrick McKann
I seem to come to this problem alot, and I can find my way out of it with a loop, but I wish, and wonder if there is a better way. Here's an example (lmer1-5 are a series of lmer objects): bs=data.frame(bic=BIC(lmer1,lmer2,lmer3,lmer4,lmer5)$BIC) rownames(bs)=c('lmer1','lmer2','lmer3','lmer4','

Re: [R] Windows editor suggestions - autosave

2010-12-29 Thread Jonathan P Daily
I can also suggest the following: Notepad++ has an AutoSave plugin, a slew of other useful features, and a Scintilla editor. If you use other languages, it is also extensible and has almost no learning curve. NppToR is a background application that allows you to pass lines or files straight fro

Re: [R] Windows editor suggestions - autosave

2010-12-29 Thread Gabor Grothendieck
On Wed, Dec 29, 2010 at 11:32 AM, Michael Conklin wrote: > I am looking for advice on an editor to use with R (windows) that has an > autosave feature.  I typically write scripts using the RGui (and tried TinnR > yesterday) but I am having continuing problems with BSODs (non R related) and > ha

Re: [R] Removing rows with earlier dates

2010-12-29 Thread Ali Salekfard
David, Thanks alot. Your code is worked fine on the whole dataset (no memory error as I had with the other ideas). I do like the style - especialy the fact that it is all in one line - , but for large datasets it takes longer than what I wrote. I ran it on the same machine with the same set of rul

Re: [R] JGR installation problem

2010-12-29 Thread Uwe Ligges
Do you have Java installed? If so, please ask on the JGR mailing list. Uwe Ligges On 29.12.2010 11:30, SNV Krishna wrote: Hi All, I am trying to install JGR GUI for R (windows xp) but facing the problem. The following error message is displayed when I click on JGR.exe "Cannot find Java/R In

Re: [R] Windows editor suggestions - autosave

2010-12-29 Thread Joshua Wiley
Hi, Take a look at Emacs + ESS (http://ess.r-project.org/). In Emacs you can setup autosaves and control the time interval between them, and it has a number of other wondeful features as a text editor. For example: http://www.emacswiki.org/emacs/AutoSave Cheers, Josh On Wed, Dec 29, 2010 at

[R] Windows editor suggestions - autosave

2010-12-29 Thread Michael Conklin
I am looking for advice on an editor to use with R (windows) that has an autosave feature. I typically write scripts using the RGui (and tried TinnR yesterday) but I am having continuing problems with BSODs (non R related) and have in the past have had issues with R crashes and would really lik

Re: [R] Removing rows with earlier dates

2010-12-29 Thread David Winsemius
On Dec 29, 2010, at 11:03 AM, Ali Salekfard wrote: > David, > > Thanks alot. Your code is worked fine on the whole dataset (no > memory error as I had with the other ideas). I do like the style - > especialy the fact that it is all in one line - , but for large > datasets it takes longer th

[R] HELP for repeated measure ANCOVA with varying covariate

2010-12-29 Thread Dong Xie
Dear All, I am a researcher doing research in plant growth and I have a statistical problem that seems to not be able to handle. Recently, I conducted an experiment about plant growing in three different nutrient-level sediments. I harvested these every three week (three harvests in all). Some

Re: [R] Referring to an object name from within a function

2010-12-29 Thread zerfetzen
Excellent, thanks, and sorry about the test(x) goof. -- View this message in context: http://r.789695.n4.nabble.com/Referring-to-an-object-name-from-within-a-function-tp3167147p3167174.html Sent from the R help mailing list archive at Nabble.com. __ R

Re: [R] icon for an R package

2010-12-29 Thread David Winsemius
On Dec 29, 2010, at 10:03 AM, Michael Friendly wrote: I'm looking for an icon to represent an R package. Perhaps something like http://cdn2.iconfinder.com/data/icons/DarkGlass_Reworked/128x128/apps/package.png but with the R logo rather than KDE. Can't you just get the location of an "R"

Re: [R] Removing rows with earlier dates

2010-12-29 Thread David Winsemius
On Dec 29, 2010, at 9:24 AM, Ali Salekfard wrote: Thanks to everyone. Joshua's response seemed the most concise one, but it used up so much memory that my R just gave error. I checked the other replies and all in all I came up with this, and thought to share it with others and get comments

Re: [R] Problem applying Chi-square in R and Cochran's Recommendations

2010-12-29 Thread Johannes Huesing
Manoj Aravind [Wed, Dec 29, 2010 at 03:59:16PM CET]: > Sir, > > I have a problem here while applying chisquare test to the following Data ( > below the subject of this mail) ...when I wanted to test the significance > using three different free statistical packages, here R, EpiInfo and > OpenEpi.

Re: [R] helps on upgrading R in Mac OS

2010-12-29 Thread Berend Hasselman
Mao Jianfeng wrote: > > Dear R-helpers, > > I intend to upgrade R in Mac OS with updated R version and updated Mac > OS version. > > I think my Mac notebook is produced with Mac x86_64, darwin9.8.0. I > have updated my Mac OS to Mac OS X version 10.6.5. But, when I > installed R 2.12.1, the "

[R] icon for an R package

2010-12-29 Thread Michael Friendly
I'm looking for an icon to represent an R package. Perhaps something like http://cdn2.iconfinder.com/data/icons/DarkGlass_Reworked/128x128/apps/package.png but with the R logo rather than KDE. -- Michael Friendly Email: friendly AT yorku DOT ca Professor, Psychology Dept. York University

[R] Problem applying Chi-square in R and Cochran's Recommendations

2010-12-29 Thread Manoj Aravind
Sir, I have a problem here while applying chisquare test to the following Data ( below the subject of this mail) ...when I wanted to test the significance using three different free statistical packages, here R, EpiInfo and OpenEpi. *Only OpenEpi accepts the test based on Cochran's Recommendation

Re: [R] Problem applying McNemar's - Different values in SPSS and R

2010-12-29 Thread Johannes Huesing
Marc Schwartz [Wed, Dec 29, 2010 at 03:28:56PM CET]: > > On Dec 29, 2010, at 6:48 AM, Manoj Aravind wrote: > > > Thank you Marc :) > > It Certainly helped me to get the exact value of P. > > How to understand when to apply mcnemar.exact or just mcnemar.test? [...] > > Generally speaking, exac

[R] RGtk2 compilation problem

2010-12-29 Thread Shige Song
Dear All, I am trying to compile&install the package "RGtk2" on my Ubuntu 10.04 box. I did not have problem with earlier versions, but with the new version, I got the following error message : - * insta

Re: [R] Removing rows with earlier dates

2010-12-29 Thread Martin Maechler
> David Winsemius > on Fri, 24 Dec 2010 11:47:05 -0500 writes: > On Dec 24, 2010, at 11:04 AM, David Winsemius wrote: >> >> On Dec 24, 2010, at 8:45 AM, Ali Salekfard wrote: >> >>> Hi all, >>> >>> I'm new to the list but have benfited from it quite exte

Re: [R] Referring to an object name from within a function

2010-12-29 Thread David Winsemius
On Dec 29, 2010, at 9:18 AM, zerfetzen wrote: Can anyone show me how to refer to an object name that is passed to a function, from within the function? deparse(substitute(x)) For example: MyModel <- 1 test <- function(x) { if(x == 1) {cat("x is a valid object.\n")} } test(x) Well

Re: [R] Problem applying McNemar's - Different values in SPSS and R

2010-12-29 Thread Marc Schwartz
On Dec 29, 2010, at 6:48 AM, Manoj Aravind wrote: > Thank you Marc :) > It Certainly helped me to get the exact value of P. > How to understand when to apply mcnemar.exact or just mcnemar.test? > I'm a beginner to biostatistics. > > Manoj Aravind Generally speaking, exact tests are used for "

Re: [R] Removing rows with earlier dates

2010-12-29 Thread Ali Salekfard
Thanks to everyone. Joshua's response seemed the most concise one, but it used up so much memory that my R just gave error. I checked the other replies and all in all I came up with this, and thought to share it with others and get comments. My structure was as follows: ACCOUNT RULE DATE A1

[R] Panel Data Analysis in R

2010-12-29 Thread taby gathoni
Dear All, Can anyone provide me with reference notes(or steps) towards analysis of  (un)balanced panel data in R. Thank you! Kind regards, Tabitha Mundia , Project Management Office, Equity Bank Limited,P.O. Box 75104-00200 Head Office, Upper hill, NHIF BLDG

[R] Referring to an object name from within a function

2010-12-29 Thread zerfetzen
Can anyone show me how to refer to an object name that is passed to a function, from within the function? For example: MyModel <- 1 test <- function(x) { if(x == 1) {cat("x is a valid object.\n")} } test(x) What I would like this to do is pass MyModel to function test, and if it passes a

Re: [R] Any functions to manipulate (merge, cut, remove) hclust objects? (maybe through phylo?)

2010-12-29 Thread Martin Maechler
> Tal Galili > on Wed, 29 Dec 2010 14:08:26 +0200 writes: > Hello Martin, > Thank you for the reference to the "cut" option in the dendrogram help page! > I guess I was too focused on looking for a solution to the hclust object > then to think that such a method exist

Re: [R] Problem applying McNemar's - Different values in SPSS and R

2010-12-29 Thread Marc Schwartz
On Dec 28, 2010, at 4:13 PM, Johannes Huesing wrote: > Marc Schwartz [Tue, Dec 28, 2010 at 07:14:49PM CET]: > [...] >>> An old question of mine: Is there any reason not to use binom.test() >>> other than historical reasons? >> > > (I meant "in lieu of the McNemar approximation", sorry if some

[R] Simulating data and imputation

2010-12-29 Thread Sarah
Hi, I wrote a script in order to simulate data, which I will use for evaluating missing data and imputation. However, I'm having trouble with the last part of my script, in which a dataframe is constructed without missing values. This is my script: y1 <- rnorm(10,0,3) y2 <- rnorm(10,3,3) y3 <-

Re: [R] another superscript problem

2010-12-29 Thread Peter Ehlers
On 2010-12-28 11:17, Tyler Dean Rudolph wrote: Part of the reason I was having difficulty is that I'm trying to add a legend with more than one element: plot(1,1) obv = 5 txt = "Pop mean" # this works legend("topleft", legend=bquote(.(txt) == .(obv)*degree)) # but this doesn't legend("topleft"

Re: [R] Problem applying McNemar's - Different values in SPSS and R

2010-12-29 Thread Manoj Aravind
Thank you Marc :) It Certainly helped me to get the exact value of P. How to understand when to apply mcnemar.exact or just mcnemar.test? I'm a beginner to biostatistics. Manoj Aravind On Tue, Dec 28, 2010 at 11:00 PM, Marc Schwartz wrote: > > On Dec 28, 2010, at 11:05 AM, Manoj Aravind wrote: >

Re: [R] Any functions to manipulate (merge, cut, remove) hclust objects? (maybe through phylo?)

2010-12-29 Thread Tal Galili
Hello Martin, Thank you for the reference to the "cut" option in the dendrogram help page! I guess I was too focused on looking for a solution to the hclust object then to think that such a method existed for dendrograms. The cut.dendrogram doesn't solve my problem yet, since what I'm looking f

Re: [R] Any functions to manipulate (merge, cut, remove) hclust objects? (maybe through phylo?)

2010-12-29 Thread Martin Maechler
> Tal Galili > on Wed, 29 Dec 2010 13:32:26 +0200 writes: > Hello Martin, > Thank you for replying. > I have two needs: > 1) To merge two dendrograms into one. > 2) To then run cutree on it (which works on hclust, but >not on dendrogram). Well, but cut(

Re: [R] R-code to generate random rotation matrix for rotation testing

2010-12-29 Thread Martin Maechler
> Martin Krautschke > on Mon, 27 Dec 2010 22:47:26 +0100 writes: > I am looking for an implementation of random rotation > matrix generation in R to do a rotation test: I want to > use the matrices to create random multivariate normal > matrices with common covariance

Re: [R] linear regression for grouped data

2010-12-29 Thread entropy
Thanks alot for the quick responses. I have some additional questions related to this topic. In fact, my intention was to be able to answer questions like what percent of the regressions have p_values less than a certain threshold, how do residuals look like, how do the plots of y vs. x look like,

Re: [R] Any functions to manipulate (merge, cut, remove) hclust objects? (maybe through phylo?)

2010-12-29 Thread Tal Galili
Hello Martin, Thank you for replying. I have two needs: 1) To merge two dendrograms into one. 2) To then run cutree on it (which works on hclust, but not on dendrogram). I guess that if I knew how to perform both steps I would be able to do what I'm trying to do on my data. If nothing like this c

Re: [R] Any functions to manipulate (merge, cut, remove) hclust objects? (maybe through phylo?)

2010-12-29 Thread Martin Maechler
> "TG" == Tal Galili > on Mon, 27 Dec 2010 23:34:33 +0200 writes: TG> Hello all, I'm now working with hclust objects and was TG> hoping to perform some basic editing on them like: TG>- Joining = the merging of two hclust objects (so TG> they will share one root) -

[R] helps on upgrading R in Mac OS

2010-12-29 Thread Mao Jianfeng
Dear R-helpers, I intend to upgrade R in Mac OS with updated R version and updated Mac OS version. I think my Mac notebook is produced with Mac x86_64, darwin9.8.0. I have updated my Mac OS to Mac OS X version 10.6.5. But, when I installed R 2.12.1, the "version" function still gave me informati

[R] JGR installation problem

2010-12-29 Thread SNV Krishna
Hi All, I am trying to install JGR GUI for R (windows xp) but facing the problem. The following error message is displayed when I click on JGR.exe "Cannot find Java/R Interface (JRI) library (jri.dll) Please make sure you start JGR by double clicking the JGR.exe program" I know this is R help