[R] error mesage

2007-04-26 Thread Emily Townsend
Error reading header after processing 0 entries I am able to download but unable to open and the above is the error message I receive. Any ideas? Thanks Emily Townsend [[alternative HTML version deleted]] __ R-help@stat.math.ethz.ch

Re: [R] Reduced Error Logistic Regression, and R?

2007-04-26 Thread paulandpen
Further to Simon's points, Here is what is confusing to me and I highlight the section of the claims below: The key assumption concerns symmetrical error constraints. These symmetrical error constraints force a solution where the probabilities of positive and negative error are symmetrical

[R] NA in lm()

2007-04-26 Thread vinod gullu
Hi all, I am trying to fit full quadratic model i.e liear + square + interaction terms to my data (216 data points), so in my case coefficients are 28 (6 parameters). When i look into summary lm() of model all cross terms coefficients are NA. What does this mean? Is the regression is not able to

Re: [R] dist label names

2007-04-26 Thread Jari Oksanen
L.Stirton at uea.ac.uk writes: Hello, I am trying to do a multi-dimensional scaling of the World Bank's quality of governance indicators for the Balkan region. I am having trouble labelling my plot. Could some kind person help me out. How do I set the attribute Label by a variable (say,

[R] configure: WARNING: you cannot build info or HTML versions of the R manuals

2007-04-26 Thread W Eryk Wolski
Rusers, I am trying to build R2.5 on my Kubuntu machine an configure concludes with : configure: WARNING: you cannot build info or HTML versions of the R manuals What do I need to install on my machine to get rid of this warnings? Eryk [[alternative HTML version deleted]]

[R] tcltk support....

2007-04-26 Thread W Eryk Wolski
Rusers, library(Rcmdr) Loading required package: tcltk Error in firstlib(which.lib.loc, package) : Tcl/Tk support is not available on this system While installing R I run configure with configure --prefix=/bla/bla --with-tcltk make make install configure did not returned any errors.

Re: [R] configure: WARNING: you cannot build info or HTML versions of the R manuals

2007-04-26 Thread Peter Dalgaard
W Eryk Wolski wrote: Rusers, I am trying to build R2.5 on my Kubuntu machine an configure concludes with : configure: WARNING: you cannot build info or HTML versions of the R manuals What do I need to install on my machine to get rid of this warnings? Texinfo. Not sure if that is also

Re: [R] configure: WARNING: you cannot build info or HTML versions of the R manuals

2007-04-26 Thread W Eryk Wolski
Texinfo. Not sure if that is also the package name on *ubuntu/debian. It's called texinfo on ubuntu/debian and it fixed the problem. Thanks a lot Peter. Eryk [[alternative HTML version deleted]] __ R-help@stat.math.ethz.ch mailing list

Re: [R] tcltk support....

2007-04-26 Thread Stefan Grosse
tcltk must be installed on your system, it is not a R package. Which Linux are you using? W Eryk Wolski wrote: Rusers, library(Rcmdr) Loading required package: tcltk Error in firstlib(which.lib.loc, package) : Tcl/Tk support is not available on this system While installing R I run

[R] Multiple trellis plots without intervening space

2007-04-26 Thread David Lindelof
Dear useRs, I'm trying to create a 10x7 rectangular grid of individual plots, each of which is a contour plot that shows a slice from a three-dimensional matrix. How can I specify that I do not want any margin at all between the plots, nor tick marks or axis labels? I have tried setting every

Re: [R] tcltk support....

2007-04-26 Thread Stefan Grosse
To my excuse I can say that I would have expected configure to issue an error or warning. I am absolutely certain that there was a remark during configure... you probably just have overseen that. I did run it configure with --with-tcltk. But there was not a singel message which would

Re: [R] tcltk support....

2007-04-26 Thread W Eryk Wolski
I use ubuntu/kubuntu... I did not had the dev packages installed. The problem is no solved. To my excuse I can say that I would have expected configure to issue an error or warning. I did run it configure with --with-tcltk. But there was not a singel message which would point me to the fact

Re: [R] tcltk support....

2007-04-26 Thread Stefan Grosse
I just read another post so I know youre on (K)ubuntu: you need to install tcl8.4-dev and tk84-dev packages. If there is no tcl/tk R installs nevertheless but is stating that at the configuration that there is no tcl/tk support... so thats where you have to look at. Maybe it is better you

[R] adding a column to a matrix

2007-04-26 Thread raymond chiruka
i would like to add a variable to an existing matrix by manipulating 2 previous variables eg for the data m treat strata censti survTime [1,] 1 2 284.684074 690.4961005 [2,] 1 1 172.764515 32.3990335 [3,] 1 1 2393.195400 24.6145279

Re: [R] adding a column to a matrix

2007-04-26 Thread Dimitris Rizopoulos
just try: cbind(m, m[, censti] m[, survtime]) I hope it helps. Best, Dimitris Dimitris Rizopoulos Ph.D. Student Biostatistical Centre School of Public Health Catholic University of Leuven Address: Kapucijnenvoer 35, Leuven, Belgium Tel: +32/(0)16/336899 Fax: +32/(0)16/337015 Web:

Re: [R] adding a column to a matrix

2007-04-26 Thread Vladimir Eremeev
m-cbind(m,0) m[m[,3]m[,4],5]-1 colnames(m)[5]-censoring raymond chiruka wrote: i would like to add a variable to an existing matrix by manipulating 2 previous variables eg for the data m treat strata censti survTime [1,] 1 2 284.684074 690.4961005

Re: [R] tcltk support....

2007-04-26 Thread Peter Dalgaard
Stefan Grosse wrote: To my excuse I can say that I would have expected configure to issue an error or warning. I am absolutely certain that there was a remark during configure... you probably just have overseen that. There's a whole sequence of them. Here's how it looks when

Re: [R] help

2007-04-26 Thread Jim Lemon
Natalie O'Toole wrote: Hi, Would anyone know how to calculate the modal value of LeafArea? Thank-you very much!! Nat __ Hi all, I have 2 questions: 1)How do I calculate the mean on an imported txt file? I've imported the file below and that's what it looks

[R] from R to html

2007-04-26 Thread elyakhlifi mustapha
hello, here's a data frame A2 Gr_C Id_Cara Libc_C Unit_C 1 30770 743 SCLERO CAP% % 2 30770 627 RDT GR PR SEC q/ha 3 30770 638PEUPL M2 nb/m2 4 30770 740 SCLEROTI % COLL % 5 30770 739 VERSE RECOLT%NB % and I 'd like to export it to

Re: [R] R News, volume 7, issue 1 is now available --error in AMMI article

2007-04-26 Thread John Fox
Dear Yuandan, My attention was drawn by your claim of an error in AMMI article. As you say, the code for the AMMI function is given directly in the article. If the argument biplot is equal to 1, then a biplot is drawn by the function, as is apparent from the section of code labelled ## 5 -

[R] comparing two matrices, row by row

2007-04-26 Thread Federico Abascal
Estimated people, I have two matrices: ar1 - array(data=c(1:16),dim=c(4,4)) ar2 - array(data=c(1,2,3,3,5:16),dim=c(4,4)) They only differ in the fourth row. I would like to compare them in order to know which columns are equal. The following works, but I would like to have a better solution,

Re: [R] comparing two matrices, row by row

2007-04-26 Thread gyadav
Please have a look at this :-) ar1 - array(data=c(1:16),dim=c(4,4)) ar2 - array(data=c(1,2,3,3,5:16),dim=c(4,4)) z-ar1==ar2 ar1 [,1] [,2] [,3] [,4] [1,]159 13 [2,]26 10 14 [3,]37 11 15 [4,]48 12 16 ar2 [,1] [,2] [,3] [,4] [1,]1

[R] comparing two matrices, row by row

2007-04-26 Thread Federico Abascal
Estimated people, I have two matrices: ar1 - array(data=c(1:16),dim=c(4,4)) ar2 - array(data=c(1,2,3,3,5:16),dim=c(4,4)) They only differ in the fourth row. I would like to compare them in order to know which columns are equal. The following works, but I would like to have a better

Re: [R] from R to html

2007-04-26 Thread ronggui
Try the package R2HTML. On 4/26/07, elyakhlifi mustapha [EMAIL PROTECTED] wrote: hello, here's a data frame A2 Gr_C Id_Cara Libc_C Unit_C 1 30770 743 SCLERO CAP% % 2 30770 627 RDT GR PR SEC q/ha 3 30770 638PEUPL M2 nb/m2 4 30770 740

Re: [R] R News, volume 7, issue 1 is now available --error in AMMI article

2007-04-26 Thread Lux Zhang
On 26/04/07, John Fox [EMAIL PROTECTED] wrote: Dear Yuandan, My attention was drawn by your claim of an error in AMMI article. As you say, the code for the AMMI function is given directly in the article. If the argument biplot is equal to 1, then a biplot is drawn by the function, as is

Re: [R] barchart producing incorrect number of barcharts when columns renamed

2007-04-26 Thread Colm G. Connolly
On 25 Apr 2007, at 19:50, Deepayan Sarkar wrote: You seem to have missed this footer that appears in every r-help message. Your code is not reproducible, and not minimal by a long, long, shot. Indeed you are correct. My apologies. This more minimal code should demonstrate the problem. I've

Re: [R] R News, volume 7, issue 1 is now available --error in AMMI article

2007-04-26 Thread Lux Zhang
On 26/04/07, Lux Zhang [EMAIL PROTECTED] wrote: On 26/04/07, John Fox [EMAIL PROTECTED] wrote: Dear Yuandan, My attention was drawn by your claim of an error in AMMI article. As you say, the code for the AMMI function is given directly in the article. If the argument biplot is

Re: [R] R News, volume 7, issue 1 is now available --error in AMMI article

2007-04-26 Thread John Fox
Dear Yuandan, The function definition given in the article doesn't produce an error for me. Regards, John John Fox, Professor Department of Sociology McMaster University Hamilton, Ontario Canada L8S 4M4 905-525-9140x23604 http://socserv.mcmaster.ca/jfox

Re: [R] barchart producing incorrect number of barcharts when columns renamed

2007-04-26 Thread jim holtman
Check you column names on the first plot. You have two of them called R Thalamus and R Mid Fron Gy. This might be causing you problems. On 4/26/07, Colm G. Connolly [EMAIL PROTECTED] wrote: On 25 Apr 2007, at 19:50, Deepayan Sarkar wrote: You seem to have missed this footer that appears in

[R] deleting collumns with colSums==0

2007-04-26 Thread Milton Cezar Ribeiro
Dear all, I have some matrices which colSums are equal to zero and I would like to delete all them. How can I do that? Kind regards, miltinho Brazil __ [[alternative HTML version deleted]]

Re: [R] deleting collumns with colSums==0

2007-04-26 Thread Giovanni Petris
A - A[, colSums(A) != 0] (untested) Date: Thu, 26 Apr 2007 05:19:21 -0700 (PDT) From: Milton Cezar Ribeiro [EMAIL PROTECTED] Sender: [EMAIL PROTECTED] Precedence: list Dear all, I have some matrices which colSums are equal to zero and I would like to delete all them. How can I do

Re: [R] NA in lm()

2007-04-26 Thread Uwe Ligges
vinod gullu wrote: Hi all, I am trying to fit full quadratic model i.e liear + square + interaction terms to my data (216 data points), so in my case coefficients are 28 (6 parameters). When i look into summary lm() of model all cross terms coefficients are NA. What does this mean? Is the

Re: [R] deleting collumns with colSums==0

2007-04-26 Thread jim holtman
I assume that you mean you want the columns deleted. If so, this might work: set.seed(1) x - matrix(sample(0:1,100,replace=TRUE,prob=c(.9,.1)), ncol=10) x [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,]001000100 0 [2,]000

Re: [R] Problem opening connections to removable hard drive

2007-04-26 Thread Uwe Ligges
I tried with R-2.4.1 and R-2.5.0 - it works for me. Can you please try again with R-2.5.0? Uwe Ligges Elizabeth Purdom wrote: Hi, I have my files and R session on a portable hard drive to be able to work across computers since I have some extremely large files. I have just started doing

Re: [R] error mesage

2007-04-26 Thread Uwe Ligges
Emily Townsend wrote: Error reading header after processing 0 entries I am able to download but unable to open and the above is the error message I receive. Any ideas? Read the posting guide and tell us what you tried! Uwe Ligges Thanks Emily Townsend [[alternative

[R] Graphic plots in pdf (position)

2007-04-26 Thread Felix Wave
Hello, I have got three graphics. pdf(output.pdf) persp(zPERSP_1) persp(zPERSP_2) persp(zPERSP_3) dev.off() I will write all those on one page of a pdf file. On the left side I will write some lines text. Is this possible, positioning graphic and text elements in pdf? I has already thought I

Re: [R] R News, volume 7, issue 1 is now available --error in AMMI article

2007-04-26 Thread Duncan Murdoch
On 4/26/2007 7:55 AM, Lux Zhang wrote: On 26/04/07, Lux Zhang [EMAIL PROTECTED] wrote: On 26/04/07, John Fox [EMAIL PROTECTED] wrote: Dear Yuandan, My attention was drawn by your claim of an error in AMMI article. As you say, the code for the AMMI function is given directly in the

Re: [R] Graphic plots in pdf (position)

2007-04-26 Thread Stefan Grosse
you can place the figures with print command, e.g. pdf(output.pdf) print(text or textplot,position=c(0,0,.5,.5),more=T) print(persp(zPERSP_1),position=c(.5,0,1,0),more=T) print(persp(zPERSP_2),position=c(0,0.5,0.5,1),more=T) print(persp(zPERSP_3),position=c(.5,.5,1,1)) dev.off() pdf has options

Re: [R] configure: WARNING: you cannot build info or HTML versions of the R manuals

2007-04-26 Thread Dirk Eddelbuettel
On Thu, Apr 26, 2007 at 10:17:10AM +0200, W Eryk Wolski wrote: Rusers, I am trying to build R2.5 on my Kubuntu machine an configure concludes with : configure: WARNING: you cannot build info or HTML versions of the R manuals What do I need to install on my machine to get rid of this

[R] xyplot() and controlling panel.polygon()

2007-04-26 Thread Michael Kubovy
Dear R-helpers, How do I tell panel.polygon what greoup and panel it applies to whithin xyplot(y ~ x | c, groups = g panel = function(x, y, groups, ...){ panel.polygon(x = xpol[c, g], y = ypol[c, g], default.units = 'native') panel.xYplot(x, y, groups,

[R] Tinn-R editor question: saving syntax colour options.

2007-04-26 Thread J . delasHeras
Hi, after reading about it in the forum, I tried the Tinn-R editor (in WinXP) running R 2.5.0... nice one! However, I am trying to change the syntax-colouring from the default to my own preferences... and I can do that, but my options don't appear to be saved and get lost when I close

[R] spatial/ patches and gaps/ SADIE

2007-04-26 Thread Sam McClatchie
System: Linux kernel 2.6.15 Ubuntu dapper R version 2.4.1 ESS on Emacs 21.4.1 - Colleagues I have some spatial patterns of sardine eggs (presence /absence) over 50 years (270 surveys) and I'd like to quantify the patches and gaps to determine how many patches (i.e.

[R] Can a hyperlink be placed, thorugh R programming, on a graph?

2007-04-26 Thread Aldi Kraja
Hi, If I use x-1:10 y-rnorm(10,0,1) ### pdf(file=c:\\aldi\\test.pdf) plot(x,y) segments(x,y,x+2,y+2) segments(x,y,x+0.5,y+0.5,col=3) ### dev.off() ### q() Is there a way that I can imbed in the graph plot for each point defined by x to x+0.5 and y to y+0.5 (and colored in green) a

[R] A coding question involving variable assignments in ifelse()

2007-04-26 Thread xpRt.wannabe
Dear List, Below is a simple, standard loss model that takes into account the terms of an insurance policy: deductible - 15 coverage.limit - 75 insurance.threshold - deductible + coverage.limit tmpf - function() { loss - rlnorm(rpois(1, 3), 2, 5) sum(ifelse(loss insurance.threshold, loss -

[R] changing distributions

2007-04-26 Thread Markus Loecher
Dear fellow R users, I am struggling with the task of quantifying the statistical significance of changes in a discrete distribution over time. If I was to measure e.g. the age distribution of people entering a building on a daily basis, I would naturally observe fluctuations in that

[R] SweaveInput and absolute paths

2007-04-26 Thread Kevin R. Coombes
Hi, Is there a way to turn off the automatic inclusion of ./ at the beginning of a path specified in an \SweaveInput{} instruction? I'd like to create some reusable template modules of Sweave code and put them in a standard directory like /Resources/Affymetrix Then the corresponding

Re: [R] Tinn-R editor question: saving syntax colour options.

2007-04-26 Thread J . delasHeras
Nevermind! It looks like it's a bug in the new Tinn-R version, and a previous version (1.17) works just fine... Jose Quoting [EMAIL PROTECTED]: Hi, after reading about it in the forum, I tried the Tinn-R editor (in WinXP) running R 2.5.0... nice one! However, I am trying to change the

Re: [R] comparing two matrices, row by row

2007-04-26 Thread Finny Kuruvilla
Another similar way to do this using apply is: apply(ar1==ar2,1,all) Best, Finny Kuruvilla * Finny Kuruvilla, MD, PhD Harvard Medical School Fellowship Program in Transfusion Medicine Broad Institute of MIT and Harvard Homepage:

Re: [R] xyplot() and controlling panel.polygon()

2007-04-26 Thread Sundar Dorai-Raj
Michael Kubovy said the following on 4/26/2007 7:20 AM: Dear R-helpers, How do I tell panel.polygon what greoup and panel it applies to whithin xyplot(y ~ x | c, groups = g panel = function(x, y, groups, ...){ panel.polygon(x = xpol[c, g], y = ypol[c, g], default.units

[R] [R-pkgs] New version of ade4TkGUI

2007-04-26 Thread Jean Thioulouse
Dear UseRs, Version 0.2-1 of the ade4TkGUI package (a GUI for the ade4 package) is now available on CRAN. This version corrects a few bugs and has the following new features : - history management : commands executed in the GUI are now stored in the R session history - echo of commands on

Re: [R] A coding question involving variable assignments in ifelse()

2007-04-26 Thread Duncan Murdoch
On 4/26/2007 12:48 PM, xpRt.wannabe wrote: Dear List, Below is a simple, standard loss model that takes into account the terms of an insurance policy: deductible - 15 coverage.limit - 75 insurance.threshold - deductible + coverage.limit tmpf - function() { loss - rlnorm(rpois(1, 3),

[R] Drawing Tangent

2007-04-26 Thread Arun Kumar Saha
Dear all R-users, I would like to draw a tangent of a given function for a particular (given) point. However the straight line representing it should not cut any axis, it should be a small line. Can anyone tell me how to do this? Thanks, Arun [[alternative HTML version deleted]]

Re: [R] Can a hyperlink be placed, thorugh R programming, on a graph?

2007-04-26 Thread Aldi Kraja
Ok, Here is a simple solution: One can apply the text step (within a loop) for any other points and the hyperlinks are functional in the pdf format, and not viewable unless the mouse is over the link. If you have a better solution, let me know. x-1:10 y-rnorm(10,0,1)

Re: [R] A coding question involving variable assignments in ifelse()

2007-04-26 Thread xpRt.wannabe
Just to be sure, is what I have below the right intepretation of your suggestion: deductible - 15 coverage.limit - 75 insurance.threshold - deductible + coverage.limit tmpf - function() { loss - rlnorm(rpois(1, 3), 2, 5) n - length(loss) accept - runif(n) 0.8 payout - runif(n) 0.999

Re: [R] Drawing Tangent

2007-04-26 Thread Greg Snow
There are several options depending on what exactly you want to do. One option if you know the slope and intercept of your line is to use the clipplot function from the TeachingDemos package with abline. Or you could just choose 2 points on the tangent line and use either lines or segments to

Re: [R] A coding question involving variable assignments in ifelse()

2007-04-26 Thread Duncan Murdoch
On 4/26/2007 2:31 PM, xpRt.wannabe wrote: Just to be sure, is what I have below the right intepretation of your suggestion: Yes, that's what I suggested. Duncan Murdoch deductible - 15 coverage.limit - 75 insurance.threshold - deductible + coverage.limit tmpf - function() { loss -

[R] Simple plot question

2007-04-26 Thread David Kaplan
Hi, I have been searching and can't seem to find a simple command that will allow me to sample from a multivariate normal distribution with known covariance matrix. I am likely missing something. Thanks in advance. David --

Re: [R] Simple plot question

2007-04-26 Thread Ravi Varadhan
Check out the function mvrnorm in package MASS. library(MASS) ?mvrnorm Ravi. --- Ravi Varadhan, Ph.D. Assistant Professor, The Center on Aging and Health Division of Geriatric Medicine and Gerontology Johns

[R] Extract p-value from survdiff function

2007-04-26 Thread Armin Goralczyk
Hi list, I want to use the p-value from the survdiff function (package survival) to reuse within a function in a Kaplan-Meier plot. The p-value is somehow not a component of the value list ?! Thanks in advance -- A. Goralczyk Göttingen, Ger. __

Re: [R] Multiple trellis plots without intervening space

2007-04-26 Thread Dieter Menne
David Lindelof lindelof at ieee.org writes: I'm trying to create a 10x7 rectangular grid of individual plots, each of which is a contour plot that shows a slice from a three-dimensional matrix. The problem is that you construct individual plots, and then try to glue these together. This is a

Re: [R] SweaveInput and absolute paths

2007-04-26 Thread Dieter Menne
Kevin R. Coombes krc at mdacc.tmc.edu writes: Is there a way to turn off the automatic inclusion of ./ at the beginning of a path specified in an \SweaveInput{} instruction? Giving a full file path name works for me (Windows, R 2.4.1) \SweaveInput{C:/tmp/MyTitle.rnw} Note the if the

Re: [R] Extract p-value from survdiff function

2007-04-26 Thread Christos Hatzis
If sdf - survdiff(...) is your survdiff object, the p-value can be computed as follows: p.val - 1 - pchisq(sdf$chisq, length(sdf$n) - 1) and then use it in your K-M plot. -Christos Christos Hatzis, Ph.D. Nuvera Biosciences, Inc. 400 West Cummings Park Suite 5350 Woburn, MA 01801 Tel:

Re: [R] ANOVA results in R conflicting with results in ot her software packages

2007-04-26 Thread Dieter Menne
Simon Blomberg s.blomberg1 at uq.edu.au writes: . I won't discuss the dangers of types of sums of squares and different contrast codings. That would be tempting the wrath of the gods. See section 7.18 in the R FAQ. John Fox's Companion book also has a brief discussion (p. 140). And

Re: [R] spatial/ patches and gaps/ SADIE

2007-04-26 Thread Ben Bolker
I don't think anyone has implemented SADIE in R. It's not very widely used outside of ecology, as far as I know ... (just checked Web of Science, there are 70 hits for spatial and SADIE, and they're all ecology/entomology/phytopathology). I don't know what the licensing is like for SADIE,

Re: [R] barchart producing incorrect number of barcharts when columns renamed

2007-04-26 Thread Deepayan Sarkar
On 4/26/07, jim holtman [EMAIL PROTECTED] wrote: Check you column names on the first plot. You have two of them called R Thalamus and R Mid Fron Gy. This might be causing you problems. Yes. Basically, rows/columns get converted to grouping variables with levels given by the row/column names.

Re: [R] Extract p-value from survdiff function

2007-04-26 Thread Petr Klasterecky
You have the Chi^2 statistic and you know that it is on 1 degree of freedom with a 2-sample test. So sdf - survdiff(...) pchisq(sdf$chisq, df=1, lower=FALSE) might help in quite a common case. Generally you'll have to look at the printing function and make a modified copy to save the p-value:

[R] select if + other questions

2007-04-26 Thread Natalie O'Toole
Hi, i am trying to read a .txt file, do a couple of select if statements on my data, and then finally use the ?table function to get frequency counts on the data. Specifically, i am looking at answering the following question: What is the frequency of Grade 7 students in the province of

[R] statistical significance

2007-04-26 Thread João Fadista
Dear all, I would like some advise about which package and functions should I use for my problem in hands. Let say I have small sequences that are mapped into a long sequence. And some of these small sequences are more mapped into some regions than others. So what I want is to give some

[R] Course***New R course by Dr Bill Venables: Traditional and Modern Approaches to Statistical Modelling with R / Washington, DC July 12-13

2007-04-26 Thread elvis
XLSolutions Corporation is proud to announce our July 12-13, 2007 Traditional and Modern Approaches to Statistical Modelling with R - in Washington, DC by Dr Bill Venables. http://www.xlsolutions-corp.com/RStatsBV.htm Washington DC, July 12-13, 2007 Reserve your seat now at the early

Re: [R] select if + other questions

2007-04-26 Thread John Kane
--- Natalie O'Toole [EMAIL PROTECTED] wrote: Hi, i am trying to read a .txt file, do a couple of select if statements on my data, and then finally use the ?table function to get frequency counts on the data. Specifically, i am looking at answering the following question: What is

Re: [R] A coding question involving variable assignments in ifelse()

2007-04-26 Thread xpRt.wannabe
I made a few slight modifications to the original model in an effort to see the inner workings of the code: deductible - 1 coverage.limit - 2 insurance.threshold - deductible + coverage.limit snip set.seed(123) loss - abs(rnorm(rpois(1, 5), 1, 3)) n - length(loss) accept - runif(n) 0.8 payout

Re: [R] A coding question involving variable assignments in ifelse()

2007-04-26 Thread Duncan Murdoch
On 4/26/2007 5:21 PM, xpRt.wannabe wrote: I made a few slight modifications to the original model in an effort to see the inner workings of the code: deductible - 1 coverage.limit - 2 insurance.threshold - deductible + coverage.limit snip set.seed(123) loss - abs(rnorm(rpois(1, 5),

[R] select if + other questions

2007-04-26 Thread Natalie O'Toole
Hi, Thank-you for the response!! That worked great!! Is there any way to apply a weight variable to your file similar to what you can do in SPSS? So that all of your other variables will be weighted by the weight variable? Thanks, Nat __ Hi, i am trying to read a .txt

Re: [R] levelplot and unequal cell sizes

2007-04-26 Thread Waichler, Scott R
my.panel.levelplot - function (x, y, z, subscripts, at = pretty(z), col.regions = regions$col, ..., w, h) { regions - trellis.par.get(regions) numcol - length(at) - 1 numcol.r - length(col.regions) col.regions - if (numcol.r = numcol)

Re: [R] select if + other questions

2007-04-26 Thread John Kane
Yes but I believe it will vary depending on what package you're using. I don't deal with weigthed data so I'm not a good source Have a look at help for something like lm in the stats package (part of the base installation) for an example. ?lm weight is the fourth argument down. However

[R] Hdf5 library error when using R 2.4 within GRASS6

2007-04-26 Thread Rick Reeves
Greetings: When using R within GRASS6, and loading the rgdal library, I encounter an error loading a specific version of the HDF5 library that does not occur when I perform the same operation in R 'outside' of GRASS6: Here is a record of the error on my ubuntu system: -- Start

[R] Not showing dvi with Hmisc latex()

2007-04-26 Thread Gad Abraham
Hi, I'm using latex() from Frank Harrell's Hmisc library to produce LaTeX files. By default, it calls xdvi and displays the dvi. How can I make xdvi not show? I couldn't find a clue in the extensive documentation. Thanks, Gad ps: Hmisc 3.3-1 on R 2.5.0 for Linux. -- Gad Abraham Department

Re: [R] Not showing dvi with Hmisc latex()

2007-04-26 Thread Duncan Murdoch
On 4/26/2007 9:20 PM, Gad Abraham wrote: Hi, I'm using latex() from Frank Harrell's Hmisc library to produce LaTeX files. By default, it calls xdvi and displays the dvi. How can I make xdvi not show? I couldn't find a clue in the extensive documentation. Unclass the result so it

Re: [R] xyplot() and controlling panel.polygon()

2007-04-26 Thread Michael Kubovy
Hi Sundar, Thanks for taking a look at this On Apr 26, 2007, at 1:05 PM, Sundar Dorai-Raj wrote: Michael Kubovy said the following on 4/26/2007 7:20 AM: Dear R-helpers, How do I tell panel.polygon what greoup and panel it applies to whithin xyplot(y ~ x | c, groups = g panel =

Re: [R] xyplot() and controlling panel.polygon()

2007-04-26 Thread Deepayan Sarkar
On 4/26/07, Michael Kubovy [EMAIL PROTECTED] wrote: Hi Sundar, Thanks for taking a look at this On Apr 26, 2007, at 1:05 PM, Sundar Dorai-Raj wrote: Michael Kubovy said the following on 4/26/2007 7:20 AM: Dear R-helpers, How do I tell panel.polygon what greoup and panel it applies

[R] problem installing Rpmi : mpi.h...Found in /usr/include/lam, yet libmpi not found

2007-04-26 Thread nicolas bertin
I cannot manage to install Rmpi_0.5-3 ... using the regular Rshell install.packages(Rpmi) I followed the advice of Martin to run the shell install command and specify the location of mpi (located in /usr/lib64/lam/ on my machine) That is : R CMD INSTALL

Re: [R] Not showing dvi with Hmisc latex()

2007-04-26 Thread Frank E Harrell Jr
Duncan Murdoch wrote: On 4/26/2007 9:20 PM, Gad Abraham wrote: Hi, I'm using latex() from Frank Harrell's Hmisc library to produce LaTeX files. By default, it calls xdvi and displays the dvi. How can I make xdvi not show? I couldn't find a clue in the extensive documentation. Unclass

Re: [R] xyplot() and controlling panel.polygon()

2007-04-26 Thread Michael Kubovy
Hi Sundar, On Apr 26, 2007, at 10:03 PM, Deepayan Sarkar wrote: On 4/26/07, Michael Kubovy [EMAIL PROTECTED] wrote: Hi Sundar, Thanks for taking a look at this On Apr 26, 2007, at 1:05 PM, Sundar Dorai-Raj wrote: Michael Kubovy said the following on 4/26/2007 7:20 AM: Dear

[R] Extracting values from an array

2007-04-26 Thread Met Man
I have an array with dimension of 5001 (rows) by 40 (columns). This array is a series of power output from a wind turbine in kW. The rows correspond to wind speed from 0 to 50 m/s in 0.01 m/s step increments. The columns correspond to the air density values from 0.90 to 1.30 kg/m3 in 0.01

[R] Unwanted white borders on semi-transparent polygons?

2007-04-26 Thread Matthew Neilson
Hey all, I'm trying to create a plot of two semi-transparent regions. The reason they need to be partially transparent is so that I can see if there's any overlap. Here's some example code: # BEGIN pdf(file=test.pdf,version=1.4) plot(0,0,type=l,ylim=range(-3,3),xlim=range(-1,5))

Re: [R] Not showing dvi with Hmisc latex()

2007-04-26 Thread Gad Abraham
Frank E Harrell Jr wrote: Duncan Murdoch wrote: On 4/26/2007 9:20 PM, Gad Abraham wrote: Hi, I'm using latex() from Frank Harrell's Hmisc library to produce LaTeX files. By default, it calls xdvi and displays the dvi. How can I make xdvi not show? I couldn't find a clue in the extensive

Re: [R] Extracting values from an array

2007-04-26 Thread Petr Klasterecky
power.output[wind.speed, air.density] assuming power.output is your matrix, wind.speed a vector with speeds and air.density another vector with air densities you want. Petr Met Man napsal(a): I have an array with dimension of 5001 (rows) by 40 (columns). This array is a series of power

Re: [R] Unwanted white borders on semi-transparent polygons?

2007-04-26 Thread Prof Brian Ripley
What version of R, what OS, what version of Acrobat? I don't see this in 2.5.0 on Windows (using Acrobat 7: Acrobat does not exist on Linux, AFAIK). And reading the PDF produced shows no sign of an extra object for the border. On Fri, 27 Apr 2007, Matthew Neilson wrote: Hey all, I'm

Re: [R] problem installing Rpmi : mpi.h...Found in /usr/include/lam, yet libmpi not found

2007-04-26 Thread Prof Brian Ripley
You have not told us your OS, but this looks like a x86_64 Redhat-based Linux and I will assume their file layout. If so, this is a known problem with Rmpi, which I reported to the maintainer quite a while back. You do not want --with-mpi=/usr/lib64/lam, as that is not where lam is (I presume