[R] what is "fuzzy matching"?

2003-07-17 Thread dg gdf
hello. I am a student that work on R. I need to some data frames such as "dolphins","kiwishade","cabbages","beams",... . I typed 'help.seaech("dolphins")' but the response was "No help files found with alias or title matching 'dolphins' using fuzzy matching.". what is "fuzzy matching" and how can I

Re: [R] confused about histograms

2003-07-17 Thread Richard A. O'Keefe
Jay Pfaffman <[EMAIL PROTECTED]> wrote: I've got a data set with integer codes from 0--3. I'd like a histogram with a single bar for 0, 1, 2 and 3. I'd like each of the 4 bars centered over a label. > x <- rbinom(100, 3, 0.5) > barplot(table(x)) This returns a ve

Re: [R] Minor nuisance with rw1071

2003-07-17 Thread John Fox
Dear Kjetil , Roger,and Brian, I'm not sure that this will shed any light on Kjetil's problems, but the startup for Rcmdr is .onAttach <- function(...){ cat("\nRcmdr Version 0.9-0\n") Commander() } .onLoad <- function(...){ save.options <- options(warn=-1) on.exit(options(sav

RE: [R] i need help in cluster analyse

2003-07-17 Thread Simon Blomberg
> > The Similarity Matrix was already did, and with this matrix I > > want to construct a dendrogram. > > This matrix have 14 individuals and the analyse of similarity > > (the range of statistic is 0 to 1). > > I want to use it in that way to the cluster analyse. I forgot to mention that hcl

RE: [R] Minor nuisance with rw1071

2003-07-17 Thread Tom Mulholland
It is indeed irritating, I thought it was another of my finger problems. Feel free to continue and make the tense correct. -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] Behalf Of Duncan Murdoch Sent: Friday, July 18, 2003 5:55 AM To: Prof Brian Ripley Cc: [EMAIL PROT

RE: [R] i need help in cluster analyse

2003-07-17 Thread Simon Blomberg
Rodrigo, You need to think about what type of clustering algorithm you intend to use. There are many choices. A simple example to get you started is: dist <- read.table("matrix.txt", header=TRUE) # read in your matrix from a text file dend <- hclust(as.dist(dist), method="average") # do clusteri

RE: [R] Matrix Multiplication

2003-07-17 Thread Liaw, Andy
You have/can get the source, no? I believe the answer is in R-1.7.1/src/main/array.c. Looks like it depends on what BLAS you have or don't have. Andy > -Original Message- > From: Paul, David A [mailto:[EMAIL PROTECTED] > Sent: Thursday, July 17, 2003 7:14 PM > To: '[EMAIL PROTECTED]' >

Re: [R] Minor nuisance with rw1071

2003-07-17 Thread kjetil brinchmann halvorsen
On 17 Jul 2003 at 20:59, Prof Brian Ripley wrote: > Can we check whether you are each running R in MDI or SDI mode (not that > I have a problem with either, but then I use focus-follows-mouse)? I am running in MDI mode. Switching to SDI, problem disappears. But happens only with one of my many

Re: [R] R matrices in memory

2003-07-17 Thread Douglas Bates
Francisco J Molina <[EMAIL PROTECTED]> writes: > Acording to the documentation in gsl > > "The physical row dimension tda, or trailing dimension, specifies the size > of a row of the matrix as laid out in memory" I think you may have problems here. Arrays in R are stored in column-major orderi

[R] Matrix Multiplication

2003-07-17 Thread Paul, David A
R1.7.1/Win2k: Apologies if this posts twice - the first message was not in plain text. I have looked in help.start() and tried typing "crossprod" and "%*%" into the RGui to get an idea for what R is using as internal algorithms for its matrix computations/manipulations... to no avail. Could s

[R] pie charts as symbols

2003-07-17 Thread Adam Langley
Hello All I am looking at a way of plotting a series of pie charts at specified locations on an existing plot. The size of the pie chart would be proportion to the magnitude of the total value of each vector (x) and the values in x are displayed as the areas of pie slices. I am essentially trying t

[R] i need help in cluster analyse

2003-07-17 Thread Rodrigo
Hello, My name is Rodrigo, I am using R program and I have a trouble. I am trying to do a dendrogram with genetics information. Let me explain... The Similarity Matrix was already did, and with this matrix I want to construct a dendrogram. So, the distance is done. I need to transform this matri

Re: [R] how to divide a string into characters? - forcomparing strings that is

2003-07-17 Thread John Fox
Dear David At 12:07 AM 7/18/2003 +0200, David Andel wrote: I am searching for a way to do something like "ABC" -> c("A","B","C"). How can this be accomplished? I tried cut() and split(), but they do something else, it seems. The purpose for doing this is to find the number of common (and uncom

Re: [R] searching (was Looking to maximize a conditional likelihood)

2003-07-17 Thread Ross Boylan
On Thu, 2003-07-17 at 15:06, Peter Dalgaard BSA wrote: > Ross Boylan <[EMAIL PROTECTED]> writes: > > > This leads to a general search question: is there a way I could have > > done a search on "conditional logit" and found this? > > In R itself, probably not. The CRAN search engine at > > http

Re: [R] how to divide a string into characters? - for comparingstrings that is

2003-07-17 Thread Jerome Asselin
Here is a way of doing by splitting the character strings. x <- "ABD" y <- "ADE" x <- unlist(strsplit(x,"")) y <- unlist(strsplit(y,"")) c(sum(as.logical(match(x,y,nomatch=0))), sum(!as.logical(match(y,x,nomatch=0 HTH, Jerome On July 17, 2003 03:07 pm, David Andel wrote: > Hi > > I am searc

[R] R matrices in memory

2003-07-17 Thread Francisco J Molina
Acording to the documentation in gsl "The physical row dimension tda, or trailing dimension, specifies the size of a row of the matrix as laid out in memory" I think that if I pass a matrix to C++ through .C as single ( or.double ), that is, .C ( as.single ( matrix )) then the tda is simply

Re: [R] how to divide a string into characters? - for comparingstrings that is

2003-07-17 Thread Roger D. Peng
David Andel wrote: Hi I am searching for a way to do something like "ABC" -> c("A","B","C"). How can this be accomplished? Try strsplit("ABC", "")[[1]] I tried cut() and split(), but they do something else, it seems. The purpose for doing this is to find the number of common (and uncommon

[R] how to divide a string into characters? - for comparing stringsthat is

2003-07-17 Thread David Andel
Hi I am searching for a way to do something like "ABC" -> c("A","B","C"). How can this be accomplished? I tried cut() and split(), but they do something else, it seems. The purpose for doing this is to find the number of common (and uncommon) characters, i.e. ultimately I want something like t

Re: [R] Looking to maximize a conditional likelihood

2003-07-17 Thread Peter Dalgaard BSA
Ross Boylan <[EMAIL PROTECTED]> writes: > > Did you check out clogit from the same package? > Wow, that looks like it exactly! Thanks. I was so sure this was a > time-series package I didn't think to look there. > This leads to a general search question: is there a way I could have > done a se

Re: [R] Minor nuisance with rw1071

2003-07-17 Thread Duncan Murdoch
On Thu, 17 Jul 2003 20:59:16 +0100 (BST), you wrote: >Duncan M has been removing show(RConsole) calls Wrong tense; that should be "did remove", and it all happened before 1.7.0. Though I'm tempted to take out some more, to stop the irritating change to the console display mode (loss of minimiza

Re: [R] Looking to maximize a conditional likelihood

2003-07-17 Thread Ross Boylan
On Thu, 2003-07-17 at 14:37, Peter Dalgaard BSA wrote: > Ross Boylan <[EMAIL PROTECTED]> writes: > > > I want to maximize a conditional likelihood function that is basically > > logistic conditional on the number of successes within strata. What > > would be a good starting place for this? A com

Re: [R] confused about histograms

2003-07-17 Thread Tony Plate
> hist(sample(0:3, 10, T), breaks=(0:4)-0.5) At Thursday 02:32 PM 7/17/2003 -0700, Jay Pfaffman wrote: I've got a data set with integer codes from 0--3. I'd like a histogram with a single bar for 0, 1, 2 and 3. I'd like each of the 4 bars centered over a label. hist(mydata, breaks=4, main="

Re: [R] confused about histograms

2003-07-17 Thread Paul Murrell
Hi Sounds like a barplot may provide a more appropriate visualisation; see ?barplot Paul Jay Pfaffman wrote: I've got a data set with integer codes from 0--3. I'd like a histogram with a single bar for 0, 1, 2 and 3. I'd like each of the 4 bars centered over a label. hist(mydata, breaks=

Re: [R] Looking to maximize a conditional likelihood

2003-07-17 Thread Peter Dalgaard BSA
Ross Boylan <[EMAIL PROTECTED]> writes: > I want to maximize a conditional likelihood function that is basically > logistic conditional on the number of successes within strata. What > would be a good starting place for this? A complication is that the > denominator includes a term that is the s

Re: [R] Looking to maximize a conditional likelihood

2003-07-17 Thread Ross Boylan
On Thu, 2003-07-17 at 14:27, Spencer Graves wrote: > Have you considered "optim"? > > spencer graves > Thank you for drawing that to my attention. I take it that's the best general purpose optimizer to use? My hope is to find something that knows a bit more about the structure of the problem, i

[R] confused about histograms

2003-07-17 Thread Jay Pfaffman
I've got a data set with integer codes from 0--3. I'd like a histogram with a single bar for 0, 1, 2 and 3. I'd like each of the 4 bars centered over a label. hist(mydata, breaks=4, main="Simulation") gives me three bars. The best I've been able to do is do something like print(hist

Re: [R] dbApply and data.frame

2003-07-17 Thread Peter Dalgaard BSA
Thomas W Blackwell <[EMAIL PROTECTED]> writes: > Runge - > > I haven't tried it out, but half a guess says that R might not like > using underscore in a variable name. Please try exactly the same > command without quotes and without the underscore: > > fraktil.df <- data.frame(LinieID=as.numer

Re: [R] Looking to maximize a conditional likelihood

2003-07-17 Thread Spencer Graves
Have you considered "optim"? spencer graves Ross Boylan wrote: I want to maximize a conditional likelihood function that is basically logistic conditional on the number of successes within strata. What would be a good starting place for this? A complication is that the denominator includes a te

[R] Looking to maximize a conditional likelihood

2003-07-17 Thread Ross Boylan
I want to maximize a conditional likelihood function that is basically logistic conditional on the number of successes within strata. What would be a good starting place for this? A complication is that the denominator includes a term that is the sum over all permutations. Although there is no t

Re: [R] Minor nuisance with rw1071

2003-07-17 Thread Roger D. Peng
I was running in MDI mode, but I don't have the problem in either mode. -roger Prof Brian Ripley wrote: Can we check whether you are each running R in MDI or SDI mode (not that I have a problem with either, but then I use focus-follows-mouse)? Duncan M has been removing show(RConsole) calls and

Re: [R] getAnyhwhere behavior

2003-07-17 Thread Prof Brian Ripley
On Fri, 11 Jul 2003, Cliff Lunneborg wrote: > I would have expected the function getAnywhere to have behaved > differently in the following: > > > search() > [1] ".GlobalEnv" "file:C:/R/Rdata/miya/.Rdata" > [3] "package:boot""package:methods" > [5] "package:cte

Re: [R] Minor nuisance with rw1071

2003-07-17 Thread Duncan Murdoch
On Thu, 17 Jul 2003 12:42:40 -0400, "kjetil brinchmann halvorsen" <[EMAIL PROTECTED]> wrote : >Hola! > >Starting with rw1071, just after starting Rgui the scope is not with >Rconsole, but some other place. This means I have to do a mouse click >in the Rconsole before starting to write the first

Re: [R] Rpart question - labeling nodes with something not in x$frame

2003-07-17 Thread Ko-Kang Kevin Wang
On Thu, 17 Jul 2003, Peter Flom wrote: > I have a tree created with > > tr.hh.logcas <- rpart(log(YCASSX + 1)~AGE+DRUGUSEY+SEX+OBSXNUM +WINDLE, > xval = 10) > > I would like to label the nodes with YCASSX rather than log(YCASSX + > 1). But the help file for text in library rpart says that you c

[R] glmmPQL with crossed random effects

2003-07-17 Thread Emma Tan
Is it possible to fit a crossed random effects model using glmmPQL and, e.g. random=pdBlocked(list(pdIdent(~a-1),pdIdent(~b-1))) as the random part of the model? I seem to be getting errors on R using glmmPQL in this way, although if I try something very similar using 'lme' instead of 'glmmPQL', i

Re: [R] dbApply and data.frame

2003-07-17 Thread Thomas W Blackwell
Runge - I haven't tried it out, but half a guess says that R might not like using underscore in a variable name. Please try exactly the same command without quotes and without the underscore: fraktil.df <- data.frame(LinieID=as.numeric(names(fraktil)), quantile85=unlist(fraktil)

Re: [R] Minor nuisance with rw1071

2003-07-17 Thread Prof Brian Ripley
Can we check whether you are each running R in MDI or SDI mode (not that I have a problem with either, but then I use focus-follows-mouse)? Duncan M has been removing show(RConsole) calls and it is quite possible that this is the cause, but we do need to be able to reproduce the problem. On Thu

[R] Rpart question - labeling nodes with something not in x$frame

2003-07-17 Thread Peter Flom
I have a tree created with tr.hh.logcas <- rpart(log(YCASSX + 1)~AGE+DRUGUSEY+SEX+OBSXNUM +WINDLE, xval = 10) I would like to label the nodes with YCASSX rather than log(YCASSX + 1). But the help file for text in library rpart says that you can only use labels that are part of x$frame, which YCA

Re: [R] Minor nuisance with rw1071

2003-07-17 Thread Roger D. Peng
This doesn't happen with me. When I startup the focus is on the console. I'm running > version _ platform i386-pc-mingw32 arch i386 os mingw32 system i386, mingw32 status major1 minor7.1 year

[R] dbApply and data.frame

2003-07-17 Thread Jesper Runge Madsen
Hallo again I now succeeded in using dbApply on my data and I can convert it into a data.frame. But as Peter Dalgaard pointed out I his answer to my earlier question (Re: [R] list to data frame, 17.07.2003) I get one row and 1 columns instead of what I want two columns and 1 rows when I c

[R] Minor nuisance with rw1071

2003-07-17 Thread kjetil brinchmann halvorsen
Hola! Starting with rw1071, just after starting Rgui the scope is not with Rconsole, but some other place. This means I have to do a mouse click in the Rconsole before starting to write the first command. Since I always forget this, I end up writing the first command twice. This is of course

Re: [R] univariate normal mixtures

2003-07-17 Thread Spencer Graves
Did you search "www.r-help.org" -> Search -> "R Site Search" and S-News (Google -> S-News -> S-News Mailing List Archives)? I recently estimated a normal mixture, 2 components, mean 0, different variances. I had computational difficulties until I took the time to avoid under and overflow

Re: R: [R] Hosmer- Lemeshow test

2003-07-17 Thread Frank E Harrell Jr
On Thu, 17 Jul 2003 16:32:05 +0200 Vito Muggeo <[EMAIL PROTECTED]> wrote: > As far as I know, the Hosmer-Lemeshow test is not a good choice, as it > depends on the groups to be formed to compute the statistic. > The design and/or hmisch packages by F.Harrell should include some > alternative GoF

Re: [R] univariate normal mixtures

2003-07-17 Thread Robert Keefe
I'll be in the lab in roughly 45 minutes, so I'll boot Frothie back up. Egads, no one can access my 394 website!! What will they do?? R _ Motorcycles are everywhere! Check twice; save a life. Rob Keefe Lab: (208) 885-5165 M.S.

Re: [R] univariate normal mixtures

2003-07-17 Thread Carlos J. Gil Bellosta
Well, If k is known, you can use maximun likelihood to fit the weights, means, and sd's. The EM algorithm can be of help to solve the optimization problem. You would have to implement it yourself for your particular case, but I do not think it is big trouble. Then you could estimate k using Ba

[R] glm.nb

2003-07-17 Thread Bruno Paul Mmbando
I am trying to fit the generalised linear model for the negative binomial, but the results which come out are attached below. When we fit this model using few covariates, the model converge. Does it mean that this family is fitted differently from other glm? or the number of zeros in my response

Re: [R] Info

2003-07-17 Thread Douglas Bates
1) Please plot your data. Notice that they are of the form y = x. That is, they fall on a straight line. 2) Please plot the curve that you expect to fit. You could do this, as I have said in previous replies, by library(nls) example(SSfpl) 3) Please plot the four-parameter logistic with

Re: [R] C compiler to R

2003-07-17 Thread Barry Rowlingson
Carlos J. Gil Bellosta wrote: gcc (I just need to write that; I tried Borland's and I only got trouble). Correct but possibly not sufficiently precise (where's Brian Ripley when we need him?). You should use the same C compiler that was used to compiler R in the first place. On Windows plat

[R] univariate normal mixtures

2003-07-17 Thread Joke Allemeersch
Hello, I have a concrete statistical question: I have a sample of an univariate mixture of an unknown number (k) of normal distributions, each time with an unknown mean `m_i' and a standard deviation `k * m_i', where k is known factor constant for all the normal distributions. (The `i' is a sub

Re: [R] Rather open question

2003-07-17 Thread Douglas Bates
"Steve Moore" <[EMAIL PROTECTED]> writes: > I have a question that I was hoping someone may be able to shed some > light on. If I wanted to analyse 1000-2000 arrays in R, how much > computing power would I need in order for the program to run O.K. Any > help that anybody could give me would be g

Re: [R] Rather open question

2003-07-17 Thread Duncan Murdoch
On Thu, 17 Jul 2003 15:58:09 +0100, "Steve Moore" <[EMAIL PROTECTED]> wrote : >Dear All, > >I have a question that I was hoping someone may be able to shed some light >on. If I wanted to analyse 1000-2000 arrays in R, how much computing power >would I need in order for the program to run O.K.

Re: [R] Excel can do what R can't?????

2003-07-17 Thread Damon Wischik
Michael Rennie wrote: > Last, it's not even that I'm getting error messages anymore- I just > can't get the solution that I get from Excel. If I try to let R find > the solution, and give it starting values of c(1,2), it gives me an > optimization solution, but an extremely poor one. However, if

Re: [R] C compiler to R

2003-07-17 Thread Carlos J. Gil Bellosta
gcc (I just need to write that; I tried Borland's and I only got trouble). Sincerely, Carlos J. Gil Bellosta Sigma Consultores Estadísticos http://www.consultoresestadisticos.com Cezar Augusto de Freitas Anselmo wrote: Hi, all. I'd like know which is the more appropriate C compiler to use with R

[R] C compiler to R

2003-07-17 Thread Cezar Augusto de Freitas Anselmo
Hi, all. I'd like know which is the more appropriate C compiler to use with R programs. Thanks, C. Cezar Freitas (ICQ 109128967) IMECC - UNICAMP Campinas, SP - Brasil __ [EMAIL PROTECTED] mailing list https://www

Re: [R] Info

2003-07-17 Thread Spencer Graves
Thanks for providing data and sample command. (In the future, please provide the data in the form of a "data.frame" commmand. It is not as easy to read visually, but it is easier for others to copy into R.) Please follow Doug Bates' advice: 1. Plot the data. 2. Play with the no

[R] Rather open question

2003-07-17 Thread Steve Moore
Dear All, I have a question that I was hoping someone may be able to shed some light on. If I wanted to analyse 1000-2000 arrays in R, how much computing power would I need in order for the program to run O.K. Any help that anybody could give me would be greatly appreciated. Many Thanks Ste

R: [R] Hosmer- Lemeshow test

2003-07-17 Thread Vito Muggeo
As far as I know, the Hosmer-Lemeshow test is not a good choice, as it depends on the groups to be formed to compute the statistic. The design and/or hmisch packages by F.Harrell should include some alternative GoF statistics, but I didn't try. Some weeks ago there has been a similar message abou

Re: [R] Help on NNET

2003-07-17 Thread Thomas W Blackwell
I'm not a nnet() user, but after reading the help, there are two things you might try, both in the model formula passed to nnet() in the third line of code below. Alternate version: pupil.nn2 <- nnet( as.factor(Type) ~ X1 + X2, ... (with all the remaining arguments as before). I

Re: [R] Formal definitions of R-language.

2003-07-17 Thread Peter Dalgaard BSA
Murad Nayal <[EMAIL PROTECTED]> writes: [Sensible stuff, except:] > > what sort of garbage collector it uses? > > No garbage collector. uses reference counting to discard objects that > are no longer needed. No, R uses garbage collection with a "generational" scheme which looks more frequently a

Re: [R] Formal definitions of R-language.

2003-07-17 Thread Peter Dalgaard BSA
[Oops. Accidentally sent only to D.Trainor first time around, even though it was intended mainly for M.Kondrin and the list] Douglas Trainor <[EMAIL PROTECTED]> writes: > Uwe Ligges wrote: > > > M.Kondrin wrote: > > > >> Hello! > >> Some CS-guys (the type who knows what Church formalism is) keep

Re: [R] Formal definitions of R-language.

2003-07-17 Thread Thomas Lumley
On Thu, 17 Jul 2003, M.Kondrin wrote: > Douglas Trainor wrote: > > > > Tell the "CS-guys" to grab the source code and chew on the LALR > > context-free grammar stuff in the file "gram.y" as in: > > > >R-1.7.1/src/main/gram.y > > > > "R Language Definition" lives at: > > > >http://cran.r-pr

Re: [R] Formal definitions of R-language.

2003-07-17 Thread Murad Nayal
some comments. I am still learning S/R so please let me know if I am missing something. "M.Kondrin" wrote: > > Hello! > Some CS-guys (the type who knows what Church formalism is) keep asking > me questions about formal definitions of R-language that I can not > answer (or even understand). Is t

[R] Hosmer- Lemeshow test

2003-07-17 Thread Andi Felber
dear all, i made some analysis with logistic regression. do you know if there is already a function available for the hosmer-lemeshow fitness test? thank you very much for the help best wishes andi __ [EMAIL PROTECTED] mailing list https://www.stat.

Re: [R] Fatal error in SJava.

2003-07-17 Thread Heinz Grimm
>Dear r-helpers, >I have been trying to invoke R from Java in a Windows 2000 computer >(unfortunately). All my environment variables seem to be properly set, >everything seems to be in order, but I obtaining a >Fatal error: unable to open the base package >error window. [...] >Some time ago

Re: [R] Info

2003-07-17 Thread Thomas W Blackwell
Please DO READ the section "Details" in help("nls"). - tom blackwell - u michigan medical school - ann arbor - __ [EMAIL PROTECTED] mailing list https://www.stat.math.ethz.ch/mailman/listinfo/r-help

[R] Info

2003-07-17 Thread Andrea Calandra
Sorry I'm student in biomedical engineer and i have to solve this formula for immuno-assay. I need to design a calibration curve But i don't understand How can i write this formula in R language: y = a + (c - a) /(1+ e[-b(x-m]) where x = ln(analyte dose + 1) y = the optical absorbance data a = t

Re: [R] line length limitation in ROracle

2003-07-17 Thread David James
Hi, The message is > junk <- paste(sample(letters, size=5000, replace=T), collapse="") > rs <- dbSendQuery(con, junk) Error in oraPrepareStatement(con, statement, bind = NULL) : RS-DBI driver: (too long a statement -- it must has less than 4000 chars) so I wouldn't call it a bug

RE: [R] duplicate row.names

2003-07-17 Thread John Smith
row.names=NULL seems to have fixed my problem. strange that NULL uses row numbers and not specifying uses row numbers, but NULL poses no problems and the latter does. Thanks to you and everyone else who responded. John -Original Message- From: Simon Blomberg [mailto:[EMAIL PROTECTED] Se

[R] line length limitation in ROracle

2003-07-17 Thread lutz . thieme
Hello everybody, I found that queries (send by "dbExecStatement" ) with more than 4000 characters length produces an error in ROracle (ver 0.3-3). Maybe there is a limitation of 4kB Is this a bug? If yes, is this problem solved in the latest version of ROracle (ver 0.5-0)? My system inform

[R] line colors in lattice.xyplot with png device.

2003-07-17 Thread Marc Mamin
Hi, R is very new for me, so excuse if my questions are too basic... BTW, are there any forum where new R users could get help without annoying this huge mailing list ? In following code, I'd like to choose the color for each of the curve diplayed. png(filena

RE: [R] remove and put back elements in vector

2003-07-17 Thread Ted Harding
On 17-Jul-03 Angel wrote: > Got a vector, lets say: > a<-c(1,2,40,10,3,20,6); ># I remove values larger than 10 > a<-a[a<10] ># Do some operations on the new a "1 2 3 6" > b<-a^2 ># Now b is "[1] 1 4 9 36" ># Now I want to insert the elements I removed in a back into a and b ># so I get: ># a

[R] Silverman modality test

2003-07-17 Thread Jerome Sackur
Dear R users, I've written the following functions to implement Silverman's modality test ("Using kernel density estimates to investigate multimodality", J.R. Stat. Soc. B, 43, (1981), 97-99.), and I tested them on the Chondrite data set (Good & Gaskins, J. Amer. Stat. Ass., 75, (1980), 42-56). Va

Re: [R] remove and put back elements in vector

2003-07-17 Thread Adaikalavan Ramasamy
Would a simple ifelse() do ? a <- ifelse( a < 10, a^2, a ) On Thu, 17 Jul 2003, Torsten Hothorn wrote: > > > On Thu, 17 Jul 2003, Angel wrote: > > > > > Hi, > > How can I remove elements from a vector and them put them back in place?? > > An example (very simple, my vector/operations are

Re: [R] remove and put back elements in vector

2003-07-17 Thread Uwe Ligges
Angel wrote: Hi, How can I remove elements from a vector and them put them back in place?? An example (very simple, my vector/operations are much larger/complicated): Got a vector, lets say: a<-c(1,2,40,10,3,20,6); # I remove values larger than 10 a<-a[a<10] # Do some operations on the new a "1 2

Re: [R] remove and put back elements in vector

2003-07-17 Thread Torsten Hothorn
On Thu, 17 Jul 2003, Angel wrote: > > Hi, > How can I remove elements from a vector and them put them back in place?? > An example (very simple, my vector/operations are much larger/complicated): > Got a vector, lets say: > a<-c(1,2,40,10,3,20,6); you need to save the index of the elements o

[R] remove and put back elements in vector

2003-07-17 Thread Angel
Hi, How can I remove elements from a vector and them put them back in place?? An example (very simple, my vector/operations are much larger/complicated): Got a vector, lets say: a<-c(1,2,40,10,3,20,6); # I remove values larger than 10 a<-a[a<10] # Do some operations on the new a "1 2 3 6" b<-a^2

Re: [R] Formal definitions of R-language.

2003-07-17 Thread M.Kondrin
Douglas Trainor wrote: Uwe Ligges wrote: M.Kondrin wrote: Hello! Some CS-guys (the type who knows what Church formalism is) keep asking me questions about formal definitions of R-language that I can not answer (or even understand). Is there some freely available papers which I can throw at the

Re: [R] missing values and gam (was: how to handle missing values)

2003-07-17 Thread Simon Wood
mgcv 0.9 will handle missing values properly (provided you are happy that dropping them is 'proper'). There is a pre-release version at: www.stats.gla.ac.uk/~simon/simon/mgcv.html (it is a pre-release version, so there will be bugs, reports of which gratefully received!) simon > Thank you for

Re: [R] Excel can do what R can't?????

2003-07-17 Thread Spencer Graves
For "lexical scoping", read some of the better documentation on R. At minimum, check "www.r-project.org" -> search -> "R site search". spencer graves Michael Rennie wrote: Quoting "Roger D. Peng" <[EMAIL PROTECTED]>: I'm having a little difficulty understanding this thread. If Excel can do

Re: [R] Keeping track of occurrence of warning message

2003-07-17 Thread Spencer Graves
Have you tried setting "options(warn=1)"? I don't know if this will help, but I saw it on a related thread recently. spencer graves Tan Chuen Seng wrote: Hi Laurent, Sorry to trouble you again. I have little idea how to get R to know if a warning has taken place. I tried using last.warning as

RE: [R] Recode from 2 variables

2003-07-17 Thread Mulholland, Tom
Thank you. When I received the reply it dawned on me why my attempts had been unsuccessful. HR, HRRES and SUBURB are all factors. It's time to go home I was at this solution an hour ago and somehow missed it. I've now got it working. -Original Message- From: Petr Pikal [mailto:[EMAIL P

Re: [R] Stem and leaf display?

2003-07-17 Thread Peter Wolf
Some weeks ago I wrote a function to construct a stem-and-leaf-display because we want to have some more parameters to control the result. D.Trenkler remind me of /Velleman/Hoaglin: ABC of EDA, page 15: "It is easy to construct a Stem-and-Leaf-Display by hand... It is not nearly as easy to write

Re: [R] Testing for numeric(0)

2003-07-17 Thread Laurent Gautier
On Thu, Jul 17, 2003 at 10:16:28AM +0200, Søren Højsgaard wrote: > Hi all, Can anyone tell me how to test for numeric(0) ? > Best regards > Søren Højsgaard foo <- numeric(0) identical(foo, numeric(0)) Hopin' it helps, L. > > __ > [EMAIL PROTEC

Re: [R] Formal definitions of R-language.

2003-07-17 Thread Douglas Trainor
Uwe Ligges wrote: M.Kondrin wrote: Hello! Some CS-guys (the type who knows what Church formalism is) keep asking me questions about formal definitions of R-language that I can not answer (or even understand). Is there some freely available papers which I can throw at them where it would be exp

Re: [R] Testing for numeric(0)

2003-07-17 Thread Barry Rowlingson
Søren Højsgaard wrote: Hi all, Can anyone tell me how to test for numeric(0) ? > foo <- numeric(0) > length(foo) [1] 0 > is.numeric(foo) [1] TRUE so: is.numeric0 <- function(x){length(x)==0 & is.numeric(x)} seems to do the trick Baz __ [EMAIL PR

Re: [R] bwplot does something weird with Hmisc library attached

2003-07-17 Thread Martin Maechler
> "Petr" == Petr Pikal <[EMAIL PROTECTED]> > on Wed, 16 Jul 2003 17:13:57 +0200 writes: Petr> Dear all I would like to ask you about possible bug in Petr> using bwplot (from lattice) together with Hmisc Petr> library attached. I found it in my actual data, but Petr> her

[R] Testing for numeric(0)

2003-07-17 Thread Søren Højsgaard
Hi all, Can anyone tell me how to test for numeric(0) ? Best regards Søren Højsgaard __ [EMAIL PROTECTED] mailing list https://www.stat.math.ethz.ch/mailman/listinfo/r-help

[R] Recode from 2 variables

2003-07-17 Thread Mulholland, Tom
I am trying to create a new variable which uses the suburb names if HR and HRRES are the same but which uses HRRES if they are different. Any assistance would be appreciated as my brain has just packed up. I'm not sure I can teach myself anymore new tricks this afternoon. HR

RE: [R] Keeping track of occurrence of warning message

2003-07-17 Thread Tan Chuen Seng
Hi Laurent, Sorry to trouble you again. I have little idea how to get R to know if a warning has taken place. I tried using last.warning as I think it was what you suggested. But still track.warning is NULL although there are warnings. The code goes something like this: w1<-0 track.warning<-NULL

Re: [R] Formal definitions of R-language.

2003-07-17 Thread Uwe Ligges
M.Kondrin wrote: Hello! Some CS-guys (the type who knows what Church formalism is) keep asking me questions about formal definitions of R-language that I can not answer (or even understand). Is there some freely available papers which I can throw at them where it would be explained is R functi

[R] missing values and gam (was: how to handle missing values)

2003-07-17 Thread Tor A Strand
Thank you for all the responses on generalized additive models(gam) and missing values. I am now able set up a model using gam and have a certain understanding of how R deals with missing values. The problem is, however, I am still not able to a gam model that is from a dataset that contains missi