Re: [R] Suppress 'x' when appending to a csv file

2007-09-08 Thread John Kane
t;[EMAIL PROTECTED]> wrote: > On Sat, 2007-09-08 at 11:41 -0400, John Kane wrote: > > Is there any convenient way to supress the x that > > appears in csv export files? I would like to be > able > > to export a file and add a comment to it yet still > be > > able

[R] Suppress 'x' when appending to a csv file

2007-09-08 Thread John Kane
Is there any convenient way to supress the x that appears in csv export files? I would like to be able to export a file and add a comment to it yet still be able to read it back into R. I don't see any way to get rid of the x that seperates the different appended parts. Thanks EXAMPLE x 1 2 3

Re: [R] negative value for AIC and BIC

2007-09-07 Thread John Sorkin
Oliver, I am attaching an HTML document in which I have plotted -2Log(x) vs. x. If you examine the plot you will see that -2Log(x) can be negative. Since -2Log(x) is part of AIC and BIC, AIC and BIC can be negative. John John Sorkin M.D., Ph.D. Chief, Biostatistics and Informatics Baltimore VA

Re: [R] kendall test

2007-09-06 Thread John Kane
?cor perhaps --- elyakhlifi mustapha <[EMAIL PROTECTED]> wrote: > Hello, > I thougth that there is a function which does the > kendall test in R, > I writed on the console apropos("kendall") and I > didn't found anything can you tell me how could I do > to use the kendall test? > Thanks. > > >

Re: [R] Rcmdr scatter3d

2007-09-04 Thread John Fox
scatter3d() produces as a bitmapped png graphic [e.g., via Graphs -> 3D graph -> Save graph to file, which uses rgl.snapshot()]. There is also an rgl.postscript() command, which supports some vector-graphics formats, but I've been unable to use it successfully. I hope this helps, John On

Re: [R] Row-Echelon Form

2007-09-03 Thread John Fox
ctions. I hope this helps, John - snip - # Last modified 9 July 2007 by J. Fox GaussianElimination <- function(A, B, tol=sqrt(.Machine$double.eps), verbose=FALSE, fractions=FALSE){ # A: coefficient matrix # B: right-hand side vector or matrix # tol: tole

Re: [R] How to cite the the PDF user's guide for LIMMA

2007-08-29 Thread John Kane
This depends on what style manual you , your publisher, or your institution uses. One common syle (APA ) recommends this: http://library.osu.edu/sites/guides/apagd.php#sid --- "Vallejo, Roger" <[EMAIL PROTECTED]> wrote: > Dear All, > How to cite the PDF user's guide for the LIMMA > package?

Re: [R] Excel

2007-08-29 Thread John Kane
--- Rolf Turner <[EMAIL PROTECTED]> wrote: > > On 28/08/2007, at 7:16 PM, J Dougherty wrote: > > > > > PS, I quit using Excel for most important work > after it returned a > > negative > > variance on some data I was collecting descriptive > statistics on. > > Those of you who have n

Re: [R] FAQ 7.x when 7 does not exist. Useability question

2007-08-27 Thread John Kane
--- Duncan Murdoch <[EMAIL PROTECTED]> wrote: > Deepayan Sarkar wrote: > > On 8/23/07, Duncan Murdoch <[EMAIL PROTECTED]> > wrote: > > > >> On 8/23/2007 11:28 AM, Prof Brian Ripley wrote: > >> > >>> On Thu, 23 Aug 2007, John

Re: [R] An issue with White's test in Anova

2007-08-24 Thread John Fox
Dear David, You've found a bug in Anova() for linear models that was introduced some time ago when the linear.hypothesis() function [which is used by Anova()] was modified not to report sums of squares for "White-adjusted" tests. I have to think about should be done in this case

Re: [R] perception of graphical data

2007-08-24 Thread John Fox
Dear Richard, Though slightly dated, the following article is a nice summary of the literature on graphical perception: Lewandowsky, S & Spence, I. (1989) The perception of statistical graphs. Sociological Methods and Research, 18, 200-242. I hope this helps, John On Fri, 24 Aug 2007 13:3

Re: [R] Merging two files together in R

2007-08-24 Thread john seers \(IFR\)
Try looking at ?merge If your data is in two dataframes df1 and df2: merge(df1, df2) (This will merge on SNPID because that column is common to both dataframes). --- -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Morassa Mohseni Sent: 24 August

Re: [R] How to shade vertical bands in a graph?

2007-08-24 Thread John Kane
?rect Something like this should work but I did not take the time to get the rectangles to fit properly. aa <- rnorm(25) yl <- -1.5 yh <- 2.2 xleft <- c(4, 9, 15 ,20) xright <- xleft + 3 plot(aa, ylim= c(yl,yh), type="n") rect(xleft, yl, xright,yh, col="yellow") points(aa, col="red") --- del

Re: [R] FAQ 7.x when 7 does not exist. Useability question

2007-08-23 Thread John Kane
--- Prof Brian Ripley <[EMAIL PROTECTED]> wrote: > On Thu, 23 Aug 2007, John Kane wrote: > > > The FAQ Section 7 is a very useful place for new > users > > to find out any number of R idiosycracies. > However > > there is no numbering on the FAQ Table of Con

Re: [R] FAQ 7.x when 7 does not exist. Useability question

2007-08-23 Thread John Kane
Yes that is it. Thanks --- "Michael A. Miller" <[EMAIL PROTECTED]> wrote: > >>>>> "John" == John Kane <[EMAIL PROTECTED]> > writes: > > > Apologies for the poor quality of the screen > capture. > > I think the first one

Re: [R] FAQ 7.x when 7 does not exist. Useability question

2007-08-23 Thread John Kane
> On 8/23/2007 11:28 AM, Prof Brian Ripley wrote: > > On Thu, 23 Aug 2007, John Kane wrote: > > > >> The FAQ Section 7 is a very useful place for new > users > >> to find out any number of R idiosycracies. > However > >> there is no numbering on t

Re: [R] How to fit an linear model withou intercept

2007-08-23 Thread John Sorkin
of the x and y terms will be zero. I am not sure this is what you want to do, but I am pasting below some R code that will allow you to see the affect fourcing the intercept to be zero has on the slope, and how centering the data yields a zero intercept without changing the slope. John oldpar&l

Re: [R] FAQ 7.x when 7 does not exist. Useability question

2007-08-23 Thread John Kane
Q I tend to go to the FAQ rather than Google. > > On 8/23/07, John Kane <[EMAIL PROTECTED]> wrote: > > The FAQ Section 7 is a very useful place for new > users > > to find out any number of R idiosycracies. > However > > there is no numbering on the FAQ Tab

[R] FAQ 7.x when 7 does not exist. Useability question

2007-08-23 Thread John Kane
The FAQ Section 7 is a very useful place for new users to find out any number of R idiosycracies. However there is no numbering on the FAQ Table of Content or on the Sections Tables of Contents. An R-help list reply of "Read FAQ 7.10" in response to a question about converting a factor to numeri

Re: [R] How to fit an linear model withou intercept

2007-08-23 Thread John Kane
?lm Details "A formula has an implied intercept term. To remove this use either y ~ x - 1 or y ~ 0 + x. See formula for more details of allowed formulae. " Is this what you want? --- Michal Kneifl <[EMAIL PROTECTED]> wrote: > Please could anyone help me? > How can I fit a linear model wh

Re: [R] summing columns of data frame by group

2007-08-21 Thread John Kane
?by perhaps --- Daniel O'Shea <[EMAIL PROTECTED]> wrote: > I have a data frame and one separate vector that is > a grouping variable for the data frame. I would > like to take all rows of the data frame belonging to > each group and then sum the columns with out using a > for statement. > > Some

[R] rv package, rvnorm function

2007-08-20 Thread John P. Burkett
000 beta <- rvnorm(mean=beta.hat, var=V.beta*sigma^2) R file ends here * Best regards, John -- John P. Burkett Department of Environmental and Natural Resource Economics and Department of Economics University of Rhode Island Kingston, RI 02881-0808 USA phone (401) 874-9195 __

Re: [R] recommended combo of apps for new user?

2007-08-20 Thread John Kane
--- hadley wickham <[EMAIL PROTECTED]> wrote: > On 8/18/07, John Kane <[EMAIL PROTECTED]> wrote: > > I'm just starting to get a grasp on how R works so > > don't take my words too seriously but have a look > at > > http://addictedtor.free.fr/graphi

Re: [R] R on a flash drive

2007-08-20 Thread John Kane
Oops meant to send this to the list. --- John Kane <[EMAIL PROTECTED]> wrote: > > --- Erin Hodgess <[EMAIL PROTECTED]> wrote: > > > Dear R People: > > > > Has anyone run R from a flash drive, please? > > > > If so, how did it work, pleas

Re: [R] R on a flash drive

2007-08-20 Thread John Kane
--- Erin Hodgess <[EMAIL PROTECTED]> wrote: > Dear R People: > > Has anyone run R from a flash drive, please? > > If so, how did it work, please? Yes I run R, occasionally, on a USB with no problem on WindowsXP. It works well, albeit a bit more slowly than from the hard drive which is as you w

Re: [R] SEM for categorical data

2007-08-19 Thread John Fox
ory factor-analysis model for ordinal observed variables. I hope that this helps, John --- original message --- Hi I am looking for a structural equation modeling package in R which can be used for categorical data. Is anyone aware of the existence of such a package? Would appreciate any he

Re: [R] Rcmdr window border lost

2007-08-19 Thread John Fox
nings that appear on some systems, but I thought that this problem disappeared with R 2.4.0. See ?Commander. Regards, John --- original messages -- Andy Weller wrote: > OK, I tried completely removing and reinstalling R, but this has not > worked - I am still missing window border

Re: [R] recommended combo of apps for new user?

2007-08-18 Thread John Kane
I'm just starting to get a grasp on how R works so don't take my words too seriously but have a look at http://addictedtor.free.fr/graphiques/ for some idea of what R can do for publication quality graphics. It is always possible that you might need another graphics package as well but I think it

Re: [R] multiple colors within same line of text

2007-08-17 Thread John Kane
Correction x <- seq(0, 1, length=21) db <- dbeta(x, 3,1) plot(db) colour <- c("red", "blue") mytext <- c("RED", "BLUE") mtext( mytext, at= c(2,5), side=1, col=colour) --- John Kane <[EMAIL PROTECTED]> wrote: > Hi Andrew, > > T

Re: [R] multiple colors within same line of text

2007-08-17 Thread John Kane
Hi Andrew, This is pretty clumsy but it seems to work. I suspect there are many better ways x <- seq(0, 1, length=21) plot(db) colour <- c("red", "blue") mytext <- c("RED", "BLUE") mtext( mytext, at= c(2,5), side=1, col=colour) --- Andrew Yee <[EMAIL PROTECTED]> wrote: > Hi, I'm interested in

Re: [R] residual plots for lmer in lme4 package

2007-08-17 Thread John Maindonald
normal may not be of much or any consequence. John Maindonald email: [EMAIL PROTECTED] phone : +61 2 (6125)3473fax : +61 2(6125)5549 Centre for Mathematics & Its Applications, Room 1194, John Dedman Mathematical Sciences Building (Building 27) Australian National University, C

Re: [R] ADF test

2007-08-16 Thread John C Frain
sis: stationary > > But surprisingly it leads towards rejestion of NULL [p-value is less > than 0.05], i.e. indicates a possible stationary series. However ploting a > graph of actual data set it doesn't seem so. > > Am I making any mistakes ? Can anyone give me any suggestio

Re: [R] use AnnBuilderSourceUrls with local path insted of ftp adress

2007-08-16 Thread John Zhang
> >I want to build my own GO package using the function GOPkgBuilder of AnnBuilder. It uses AnnBuilderSourceUrls to collect data from different ftp sites. These data are not complete for my organism, so I would like to change the ftp adresses to a local one. The changing itself is working but w

Re: [R] Convert factor to numeric vector of labels

2007-08-15 Thread John Kane
My reason for setting stringsAsFactors = FALSE is more that I really dislike having R convert what I "think" are character variables to factors when I import data. I suspect that it takes quite a few new users by surprise that what they had intended to be a character variable has become a factor.

Re: [R] "ung�ltige Versionsspezifikation"

2007-08-15 Thread John Kane
I think we need more information about your system. Please run sessionInfo() and include the information in another posting. --- "Mag. Ferri Leberl" <[EMAIL PROTECTED]> wrote: > Dear everybody, > excuse me if this question ist trivial, however, I > have now looked for > an answer for quite a whi

Re: [R] Convert factor to numeric vector of labels

2007-08-13 Thread John Kane
This is one of R's rather _endearing_ little idiosyncrasies. I ran into it a while ago. http://finzi.psych.upenn.edu/R/Rhelp02a/archive/98090.html For some reason, possibly historical, the option "stringAsFactors" is set to TRUE. As Prof Ripley says FAQ 7.10 will tell you as.numeric(as.chara

Re: [R] Very new - beginners questions

2007-08-13 Thread John Kane
ot;other" which leads to "contributed documentation". Books by Dalgaard, Verzani and Crawley all get good reviews. In the contributed documents area "Using R for Data Analysis and Graphics - Introduction, Examples and Commentary” by John Maindonald and "Kickstarting

Re: [R] Help wit matrices

2007-08-10 Thread John Kane
Will something like this help? mm <- matrix(rnorm(100),nrow=10) mm nn <- mm >.5 nn --- Lanre Okusanya <[EMAIL PROTECTED]> wrote: > Hello all, > > I am working with a 1000x1000 matrix, and I would > like to return a > 1000x1000 matrix that tells me which value in the > matrix is greater > tha

Re: [R] how to include bar values in a barplot?

2007-08-08 Thread John Kane
Do you mean like this? my.values=10:15 x <- barplot(my.values, ylim=c(0,11)) text(x, my.values, labels=my.values, pos=3) It is very bad practice and OOo should have its fingers slapped for perpetuating such a form. --- "Donatas G." <[EMAIL PROTECTED]> wrote: > How do I include b

Re: [R] Relocating Axis Label/Title

2007-08-08 Thread John Kane
Have a look at "mar" in ?par. You might want to try something like mar=c(5, 5, 4, 2) + 0.1 rather than the default of c(5, 4, 4, 2) + 0.1 . --- Lorenzo Isella <[EMAIL PROTECTED]> wrote: > Dear All, > I am experiencing some problems with relocating an > axis title. > I visited the following link b

Re: [R] Changing font in boxplots

2007-08-08 Thread John Kane
--- Prof Brian Ripley <[EMAIL PROTECTED]> wrote: > On Wed, 8 Aug 2007, G Iossa, School Biological > Sciences wrote: > > > Hi John, > > > > Thanks so much for such a quick reply. > > I have tried to set all to Times font running > > > > par(fon

Re: [R] Changing font in boxplots

2007-08-08 Thread John Kane
I don't know if boxplot will accept a font argument.m >From ?boxplot it is not clear. You may need to set the par() command before the boxplot Example: par(font.lab=4) boxplot(mass ~ family, data=mydata, ylab="mass %", xlab="family",las=1, cex.axis=1) --- "G Iossa, School Biological Sciences" <[

Re: [R] rank in decreasing order

2007-08-06 Thread John Logsdon
ailing list > https://stat.ethz.ch/mailman/listinfo/r-help > PLEASE do read the posting guide > http://www.R-project.org/posting-guide.html and provide commented, minimal, > self-contained, reproducible code. -- Best wishes John John Logsdon "Try to make th

Re: [R] - round() strange behaviour

2007-08-06 Thread John Logsdon
> R-help@stat.math.ethz.ch mailing list > https://stat.ethz.ch/mailman/listinfo/r-help > PLEASE do read the posting guide > http://www.R-project.org/posting-guide.html and provide commented, minimal, > self-contained, reproducible code. -- Best wishes John John Logsd

Re: [R] Plot in log scale

2007-08-05 Thread John Kane
What appears to be happening is that you are plotting all the data sets but all the lines () are being plotted outside the original plotting frame. If you just plot out$a with axes=TRUE you will see what the y coordinates are. You need to explicitly set the ylim values. There is a mockup of what

Re: [R] - round() strange behaviour

2007-08-04 Thread John Logsdon
__> > R-help@stat.math.ethz.ch > mailing list> > https://stat.ethz.ch/mailman/listinfo/r-help> > PLEASE do > read the posting guide http://www.R-project.org/posting-guide.html> > and > provide commented, minimal, self-contained, reproducible code.> >> >> > __

Re: [R] Invert Likert-Scale Values

2007-08-04 Thread John Kane
Will ?recode in the car package do what you want? x <- 1:4 recode(x, "1='4';2='3' ;3='2'; 4='1'") --- Alexis Delevett <[EMAIL PROTECTED]> wrote: > Hi! > > I am using R to process some community survey data. > Several item responses are recorded via a 7-point > Likert-Scale. As I have coded th

[R] Rmetrics and log returns

2007-08-03 Thread Kerpel, John
Hi all. How do I compute a Monday Open to Friday Close weekly return in Rmetrics from daily data? Thanks! John [[alternative HTML version deleted]] __ R-help@stat.math.ethz.ch mailing list https://stat.ethz.ch/mailman/listinfo/r-help

Re: [R] plot to postscript orientation-update

2007-08-03 Thread John Kane
Follow-up I seem to have manged to get the eps file to work using: postscript("C:/temp/figure.eps", horizontal=F, paper="special", height=8, width=8, pointsize=12) Exactly why I'm not sure since I just copied some old code that I had used a year or so ago. --- Vorlow Constantinos <[EMAIL PROTE

Re: [R] plot to postscript orientation

2007-08-03 Thread John Kane
lts. Interstingly enough figure.eps imports completely into Word but rotated 90 degrees as Miruna noted. Where are you finding the Options for Auto? I don't see them. john --- Vorlow Constantinos <[EMAIL PROTECTED]> wrote: > Hi, > > My vanilla code works fine... > &

Re: [R] problem with reading data files with different numbers oflines to skip

2007-08-03 Thread john seers \(IFR\)
e[1]) + 2 outdf<-read.table(pixfile, header=T, skip=skiplines, sep="\t") write.table(outdf, file=pixfileout, sep="\t", row.names=FALSE) } } Regards John Seers -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Tom Coh

Re: [R] plot to postscript orientation

2007-08-03 Thread John Kane
I seem to see the same problem that Miruna gets just to confirm that it is not just her set-up. I'm using GSview4.8 if that helps --- Uwe Ligges <[EMAIL PROTECTED]> wrote: > > > Miruna Petrescu-Prahova wrote: > > Hi > > > > I am trying to save some plots in a postscript > file. When I g

Re: [R] y axix number into horizontal direction

2007-08-02 Thread John Kane
?par see las This should work --- plot(0,0,xaxt="n", type="n", ylim=c(0,100), las=1, ) mtext("35",side=2,at=35, line =1, las=1) --- --- Rebecca Ding <[EMAIL PROTECTED]> wrote: > Dear R users, > > I used plot() and

[R] Multivariable correlation

2007-08-02 Thread John Sorkin
. for the matrix X=x1 x2 x3 x4 x5 x6 x7 x8 x9 I don't want the pair-wise correlations corr(x1,x2), corr(x1,x3), corr(x1,x4) . . . etc., but rather corr(x1,x2,x3,x4,x5,x6,x7,x8,x9). Thanks, John John Sorkin M.D., Ph.D. Chief, Biostatistics and Informatics Baltimore VA Medical C

Re: [R] New user help with plot.default

2007-08-02 Thread John Kane
. Also > the top edge of the ylabel letters are cut off by > the left hand side of the > plot frame. > > John Kane-2 wrote: > > > > # Draw the specific axes. > > axis(1, at=1:8, labels=chems) > > axis(2, at=0:3, labels=c("1","2","3&qu

Re: [R] New user help with plot.default

2007-08-02 Thread John Kane
Hi Paul, I think one of the problems is that xlim is expecting a numerical vector something like c(1:8) implying a contiuous variable and yours is categorical. I have made quite few changes but does this do what you want? It may not be the most effient but it runs :)

Re: [R] "Cut marks" on a plot's y-axis to indicate it is a truncated axis

2007-08-01 Thread John Kane
--- David Lloyd <[EMAIL PROTECTED]> wrote: > Hi, > > I've plotted a Kaplan-Meier curve but the curves > only range from 0.7 to > 1 on the y-axis. Therefore I have used: - > > ylim=c(0.7,1) > > [although I think convention dictates that you plot > 0.5 to 1 to show the > median? A few papers I'v

Re: [R] generating symmetric matrices

2007-07-30 Thread John Logsdon
t; > > > [[alternative HTML version deleted]] > > __ > R-help@stat.math.ethz.ch mailing list > https://stat.ethz.ch/mailman/listinfo/r-help > PLEASE do read the posting guide > http://www.R-project.org/posting-guide.html and pr

[R] Slightly OT - use of R

2007-07-30 Thread John Logsdon
exactly adopting a rigorous approach! Best wishes John John Logsdon "Try to make things as simple Quantex Research Ltd, Manchester UK as possible but not simpler" [EMAIL PROTECTED] [EMAIL PROTECTED] +44(0)161 445 4951/G:+44(0)

Re: [R] Constructing bar charts with standard error bars

2007-07-26 Thread John Zabroski
On 7/25/07, Ben Bolker <[EMAIL PROTECTED]> wrote: > John Zabroski gmail.com> writes: > > > The best clue I have so far is Rtips #5.9: > > http://pj.freefaculty.org/R/Rtips.html#5.9 which is what I based my present > > solution off of. > > > > However,

Re: [R] Finding matches in 2 files

2007-07-26 Thread john seers \(IFR\)
Something like: # Sample data g1<-c("gene1", "gene2", "gene3", "gene4", "gene5", "gene9", "gene10", "geneA") g2<-c("gene6", "gene9", "gene1", "gene2", "gene7", "gene8", "gene9", "gene1", "gene10") df1<-cbind(gene=g1, expr=runif(length(g1))) df2<-cbind(gene=g2, expr=runif(length(g2))) # Merge m

[R] Constructing bar charts with standard error bars

2007-07-25 Thread John Zabroski
I am new to R. I want to graph group data using a "Traditional Bar Chart with Standard Error Bar", like the kind shown here: http://samiam.colorado.edu/~mcclella/ftep/twoGroups/twoGroupGraphs.html Is there a simple way to do this? So far, I have only figured out how to plot the bars using barplo

Re: [R] plots

2007-07-25 Thread John Kane
--- amna khan <[EMAIL PROTECTED]> wrote: > Hi Sir > > I did not find any function of graph which plot one > variable on x-axis and 2 > or more than 2 variables on y-axis. I think ?points or ?lines may be what you want. > Moreover, how can I change the labels of L-moments > diagram obtained by

Re: [R] Operator > and

2007-07-25 Thread John Kane
mm <- matrix(1:9, nrow=3) ; mm subset(mm[,1],mm[,1] <3) # Note I used 3 not 2 here. Have a look at some of the introductory documents on the R site ( Contributed documents under OTHER in the documentation). They should answer a lot of your basic questions like this. Documents by Lemon, Maindo

Re: [R] SOS

2007-07-20 Thread John Kane
?round x <- 1.2223 round(x,2) [1] 1.22 --- Fabrice McShort <[EMAIL PROTECTED]> wrote: > Hi Julian, > > Thank you very much. Please let me know how to get 2 > numbers after the decim. > > Best regards, > > Fabrice > > > > > Date: Fri, 20 Jul 2007 08:15:42 -0700> From: > [EMAIL PROTECTED]>

Re: [R] tapply

2007-07-19 Thread John Kane
I do not understand what you want. If aps is constant over each class then the mean for each class is equal to any value of aps. Using your example you can do tapply(icu1$aps, icu1$d, mean) but it does not give you anything new. Can you explain the problem a bit more? --- sigalit mangut-

Re: [R] Classification

2007-07-18 Thread John Kane
Have a look at the recode function in the car package library(car) ?recode should give you what you need. --- "Ing. Michal Kneifl, Ph.D." <[EMAIL PROTECTED]> wrote: > Hi, > I am also a quite new user of R and would like to > ask you for help: > I have a data frame where all columns are numeric

Re: [R] LSD, HSD,...

2007-07-16 Thread John Maindonald
-statistics that lm() gives for the finally selected model can be grossly optimistic. Running the analysis with the same model matrix, but with y-values that are noise, can give a useful wake-up call. John Maindonald email: [EMAIL PROTECTED] phone : +61 2 (6125)3473fax : +61 2(6125)5549

[R] Complex surveys, properly computed SEs and non-parametric analyses

2007-07-15 Thread John Sorkin
Can someone direct me to an R function that properly computes standard errors of data obtained from a complex survery design, i.e. perform alnalyses similiar to those that can be performed with SUDAAN, particularly for a non-parametric one-way ANOVA, e.g. signed rank test? Thanks, John John

Re: [R] Fwd: THANK YOU: Updating R version

2007-07-14 Thread John C Frain
Everyone using R in Windows should look at these batch files. Some of them are pure genius and will speed the process. Thanks John On 14/07/07, Gabor Grothendieck <[EMAIL PROTECTED]> wrote: > Note that the batchfiles distribution on CRAN has two batch > programs: > > copydir

Re: [R] learning the R language (for those strong in Ruby)

2007-07-14 Thread John Kane
> teaching the R language for those who are more > familar with Ruby)? > > Alternately, a book with lots of examples about how > the R language > itself works would be fantastic. Peter Dalgaard's book "Introductory Statistics with R" or John Verzani's book &quo

[R] Fwd: THANK YOU: Updating R version

2007-07-13 Thread John C Frain
-- Forwarded message -- From: John C Frain <[EMAIL PROTECTED]> Date: 13-Jul-2007 22:30 Subject: Re: [R] THANK YOU: Updating R version To: "Christopher W. Ryan" <[EMAIL PROTECTED]> When I update R the following has worked for me (Windows XP) 1. Install th

Re: [R] Saving workspace data

2007-07-13 Thread John Kane
--- Renger van Nieuwkoop <[EMAIL PROTECTED]> wrote: > Hi > > I imported a lot of text-files with R and saved them > by using: > save(list=ls(),file="Grunddaten.Rdata") > > After that I wanted to check my saved data and wrote > source("Grunddaten.Rdata") > > This gives me an error: >

Re: [R] Algorythmic Question on Array Filtration

2007-07-13 Thread John Kane
I think we need a bit more information and perhaps a small example data set to see what you want. I am not familiar with term mass window. Is this a confidence interval around the mass value? --- Johannes Graumann <[EMAIL PROTECTED]> wrote: > Dear All, > > I have a data frame with the colum

Re: [R] how to create matrix in a loop

2007-07-13 Thread John Kane
You don't need to do a loop. You can do it with an apply statement I think. See ?apply If the matrix is "mat" to do the test by column try: apply(mat, 2, shapiro.test) --- Tavpritesh Sethi <[EMAIL PROTECTED]> wrote: > Hi all, > How does one create a matrix of values in a loop. > For example,

Re: [R] eMail results out of R

2007-07-12 Thread Scillieri, John
{ BLAT <- "PATH TO BLAT.EXE" MAILSERVER <- "your mail server here"; command <- paste(BLAT, "-", "-to", dQuote(to), "-server", MAILSERVER, "-s", dQuote(subject), "-f", dQuote(from)) system(command,

Re: [R] elementary statistics with R (rkward?)

2007-07-12 Thread John Kane
e to do this > introductory stuff with spss, that > everyone around me is using here in Lithuania, but > I'd really like to learn to > do it with R instead... > > -- > Donatas G. http://www.math.ilstu.edu/dhkim/Rstuff/Rtutor.html is not a bad place to start. John Ver

Re: [R] Previously saved workspace restored

2007-07-11 Thread john seers \(IFR\)
ot;mydata" "repos" > mydata [,1] [,2] [,3] [1,]147 [2,]2 58 [3,]369 > Regards John --- -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Kristi Glover Sent: 11 July 2007 05:18 To: r-hel

Re: [R] Repeated Measure different results to spss

2007-07-10 Thread John Vokey
This should work (with x containing the dataframe): > x$Id=factor(x$Id) > x$Group=factor(x$Group) > x$Task=factor(x$Task) > str(x) 'data.frame': 48 obs. of 4 variables: $ Id : Factor w/ 24 levels "1","2","3","4",..: 1 2 3 4 5 6 7 8 9 10 ... $ Group: Factor w/ 2 levels "1","2": 1 1 1 1 1

Re: [R] transform excel data into graph

2007-07-09 Thread John Kane
s a dotchart(dmat, labels = dat[,1]) --- cross123 <[EMAIL PROTECTED]> wrote: > > Hello everyone, > I have a set of data in the following form, which > are stored in an Excel > file: > nick john peter > > lesson

Re: [R] problem assigning to indexed data frame element

2007-07-06 Thread John Kane
Check what is happening with current.spec. It looks to me as if you are trying to use a factor as an index. See below --- "Drescher, Michael (MNR)" <[EMAIL PROTECTED]> wrote: > Hi All, > > Sorry if I ask an obvious thing, I am still new to R > ... > > I created a data frame of given dimension

[R] R Logging Package

2007-07-06 Thread Scillieri, John
> Does anyone know how to print out the current function name and line > number (similar to how warning(call.=TRUE) operates). I'd like this > for a logging package I'm working on, but I can't seem to find a way. > > Thanks for your help, > > John Scillieri

Re: [R] help with vector construction

2007-07-05 Thread John Kane
Or an alternative to Henrique's if you want to select all the rows from row 2 up to the 3*n row this may work. n <- 2 myvector <- data1[2:(2*n), 3] --- Juan Pablo Fededa <[EMAIL PROTECTED]> wrote: > Hi all, > > I want to make a vector with the third column of a > matrix, but only for the >

[R] R Logging Package

2007-07-05 Thread Scillieri, John
Does anyone know how to print out the current function name and line number (similar to how warning(call.=TRUE) operates). I'd like this for a logging package I'm working on, but I can't seem to find a way. Thanks for your help, John Scillieri >>> This e-mail

Re: [R] working with R graphics remotely

2007-07-05 Thread John Logsdon
ling list > > https://stat.ethz.ch/mailman/listinfo/r-help > > PLEASE do read the posting guide > > http://www.R-project.org/posting-guide.html and provide commented, > > minimal, self-contained, reproducible code. -- Best wishes John John Logsdon

Re: [R] Loop and cbind

2007-07-04 Thread john seers \(IFR\)
Hi In what way does it not work? My guess is that you have not declared your values outside the for loop. As they are local they will be lost on exit. You need to declare them before: ewma<-vector(length=12) standard<-vector(length=12) for ... { .... } John Seers ---

Re: [R] probabilty plot

2007-07-04 Thread John Kane
Is this what you mean ? --- mydata <- c(1,2,3,4,5,7,5,4,3) plot(mydata) --- --- along zeng <[EMAIL PROTECTED]> wrote: > Hi all, >I am a freshman of R,but I am interested in it! > Those days,I am > learning pages on NIST,with

Re: [R] vertically concatenating data frames

2007-07-03 Thread John Kane
?rbind --- "Aydemir, Zava (FID)" <[EMAIL PROTECTED]> wrote: > Hi, > > what is the recommended way to vertically > concatenate 2 data frames with > the same column names but different number of rows? > > My problem is something along these lines: > > df1 <- data.frame(var1=var1,var2=var2,va

Re: [R] select row

2007-07-03 Thread John Kane
?which Use it to find the rows and then extract the rows selection <- mydata[which(mydata$id=="25-2006"), ] should work. --- Leonardo Lami <[EMAIL PROTECTED]> wrote: > Hi all, > I have a little problem selecting some rows from a > data.frame. > I'd like to select the rows where a determin

Re: [R] Homals, PsychoR, Bayesm

2007-07-02 Thread John Kane
You need to tell us what operating system you are using. --- faisal afzal siddiqui <[EMAIL PROTECTED]> wrote: > hi, > > I am working on conjoint analysis, how I can install > Homals, PsychoR, and Bayesm in my computer, also I > need some examples in R, would u please help me? > > also advise i

Re: [R] basics: changing the directory

2007-07-02 Thread John Kane
RSiteSearch("change directory") will take you to an archive site that should help. or type ?setwd to get the relevant man page. --- Georg Ehret <[EMAIL PROTECTED]> wrote: > Dear Ms. R, >I struggle with a very basic command for most of > you: How to change the > working-directory by com

Re: [R] termplot with uniform y-limits

2007-07-02 Thread John Fox
Dear Bill, Functions in the effects package are somewhat similar to termplot, and allow you to specify the y-axis limits. For example, modify the last line of the last example in example(all.effects) to plot(eff.pres, ask=FALSE, ylim=c(10, 70)) I hope this helps, John --- original

Re: [R] SEM model fit

2007-07-01 Thread John Fox
re satisfactory results. (Because you didn't give the input correlation matrix, I can't check myself.) I'll eventually incorporate the new function is an updated version of the package. BTW, I doubt that the RMSEA confidence interval is correct for polychoric correlations. Regards, Jo

Re: [R] Function call within a function.

2007-06-29 Thread John Kane
Message- > > From: [EMAIL PROTECTED] > > [mailto:[EMAIL PROTECTED] On > Behalf Of John Kane > > Sent: Thursday, June 28, 2007 12:04 PM > > To: R R-help > > Subject: [R] Function call within a function. > > > > I am trying to call a funtion within ano

Re: [R] Function call within a function.

2007-06-29 Thread John Kane
list > ukn <- function(file, alpha, beta, nam1){ > aa <- alpha > bb <- beta > myfile <- file > nts <- lstfun(myfile, aa, bb) > ### CODE ADDED HERE > mysum <- eval(parse(text=nam1)) > #mysum <- nam1[,3]*5 > return(mysum) > } > > results <-

Re: [R] Function call within a function.

2007-06-29 Thread John Kane
file[,1]== beta) > ### CODE ADDED HERE > list1 <- list(cda=cda,cdb=cdb) > } > > # funtion to operate on list > ukn <- function(file, alpha, beta, nam1){ > aa <- alpha > bb <- beta > myfile <- file > nts <- lstfun(myfile, aa, bb) > ### CODE ADDED H

Re: [R] Function call within a function.

2007-06-29 Thread John Kane
--- Stephen Tucker <[EMAIL PROTECTED]> wrote: > Dear John, > > Perhaps I am mistaken in what you are trying to > accomplish but it seems like > what is required is that you call lstfun() outside > of ukn(). [and remove the > call to lstfun() in ukn()]. >

[R] Function call within a function.

2007-06-28 Thread John Kane
I am trying to call a funtion within another function and I clearly am misunderstanding what I should do. Below is a simple example. I know lstfun works on its own but I cannot seem to figure out how to get it to work within ukn. Basically I need to create the variable "nts". I have probably misse

[R] Method dispatch in functions?

2007-06-28 Thread John McHenry
Hi, Could someone point me in the right direction for documentation on the following question? Let's say I have two objects a and b of classes A and B, respectively. Now let's say I write a function foo that does something similar to objects of type A and B. Basically I want to overload the fu

Re: [R] Repeat if

2007-06-28 Thread john seers \(IFR\)
o:[EMAIL PROTECTED] On Behalf Of Birgit Lemcke Sent: 28 June 2007 15:12 To: john seers (IFR) Cc: R Hilfe Subject: Re: [R] Repeat if Hello John, I tried this code. But I got only the ranges of V1 and V2 what is easily understandable. Do I have to write in all 85 vectors in the first line? V&l

  1   2   3   4   5   6   7   8   9   10   >