Re: [R] No answer in anova.nls

2008-08-11 Thread Prof Brian Ripley
The reason for no F test showing up is that the additional df is 0 and the F value is Inf. But the underlying problem is that your models are not nested and so ANOVA between them is invalid. I suggest you seek help from a local statistician: your misunderstanding and your question about model

[R] No answer in anova.nls

2008-08-11 Thread Nazareno Andrade
Dear R-helpers, I am trying to check whether a model of the form y(t) = a/(1 +b*t) fits the curve of downloads per day of a file in a specific online community better than a model of the form y(t) = a*exp(-b*t). For that, I used nls to fit both models and I am now trying to compare the fits with a

[R] No answer in anova.nls

2008-08-11 Thread Nazareno Andrade
Dear R-helpers, I am trying to check whether a model of the form y(t) = a/(1 +b*t) fits the curve of downloads per day of a file in a specific online community better than a model of the form y(t) = a*exp(-b*t). For that, I used nls to fit both models and I am now trying to compare the fits with a

[R] R Citation rates

2008-08-11 Thread John Maindonald
Following some discussion with Simon Blomberg, I've done a few Web of Science citation searches. A topic search for R LANG* STAT* seems to turn up most of the references to "R: A Language and Environment for Statistical Computing" "R Development Core Team" gets transformed into an astonishing var

Re: [R] FastICA

2008-08-11 Thread Hans W. Borchers
Maura E Monville gmail.com> writes: > > Is the FastICA R implementation as good as the MatLab Implementation ? > I would appreciate talking to someone who has used FastICA for R. The fastICA packages for Matlab and R (and there is even a version for Python) have a common origin at the Helsinki

Re: [R] help.search warning?

2008-08-11 Thread Prof Brian Ripley
On Mon, 11 Aug 2008, Dong-hyun Oh wrote: Dear useRs, When I executed help.search(), I got nothing other than the following warning message. R> help.search("print") Error in help.search("print") : (converted from warning) removing all entries with invalid multi-byte character data I am usi

Re: [R] checking if multinom converged

2008-08-11 Thread Prof Brian Ripley
nnet does not return convergence information: the C code does not pass it back to R. The conventional way to fit neural networks is not to run to convergence but use so-called 'early stopping'. On Mon, 11 Aug 2008, [EMAIL PROTECTED] wrote: Is anyone aware of a way to check whether multinom h

Re: [R] T-Test Help

2008-08-11 Thread Bill.Venables
substitute into the formula for the t-statistic and use pt() to get the appropriate tail area. Roll you own, in other words. Bill Venables http://www.cmis.csiro.au/bill.venables/ -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Angelo Scozzarella Sent

[R] Multiple column/row names?

2008-08-11 Thread Hesen Peng
Hi all, I wonder if there is a way to create a matrix with two (or even more) column/row names? Thank you very much. Have a nice day. -- 彭河森 Hesen Peng http://hesen.peng.googlepages.com/ __ R-help@r-project.org mailing list https://stat.ethz.ch/mailma

[R] T-Test Help

2008-08-11 Thread Angelo Scozzarella
Hi, I want to calculate the T-Test from means and sd. How can I do it? Thanks Angelo Scozzarella __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting guide http://www.R-project.org/posting-guid

[R] KS Test for Mixture of Distributions

2008-08-11 Thread Gundala Viswanath
Hi all, How can we use ks.test() to evaluate goodness of fit of mixtures of distributions? For example I have the following dataset: > x [1] 176.1 176.8 259.6 171.6 90.0 234.3 145.7 113.7 105.9 176.2 168.9 136.1 [13] 109.2 110.3 164.3 117.7 131.3 163.7 200.4 196.4 196.2 168.6 190.4 127.5 [2

Re: [R] generating a random signal with a known correlation

2008-08-11 Thread Yasir Kaheil
OK, here is the code for those who are interested: x<-rnorm(1000, mean=20, sd=100); x.s<-scale(x) xp<-pnorm(x.s); xix<- sort(xp,index.return=TRUE)$ix norm.cop <- normalCopula(0.6) #correlation of 0.6, other libraries can be used instead of copula y <- rcopula(norm.cop, length(x)) yp<-pnorm(y) ypix

Re: [R] predict for garch

2008-08-11 Thread Spencer Graves
Hi, Erin: I just got 46 hits from RSiteSearch('predict garch'). Might any of these help you? Spencer Erin Hodgess wrote: Dear R People: Is there a predict method for garch methods, please? I tried the usual "predict(d1.garch,n.ahead=3) but only got values for the original

[R] ANOVA tables - storing F values

2008-08-11 Thread Gareth Campbell
When I run a summary(anova) I get output for all of the elements (columns) as these are multiple - single anova results. Can I store the F values? I can't find the attribute of the fitted model attributes(fit) that stores these F values, and for that matter, P values. Thanks -- Gareth Campbell

Re: [R] Splom custom superpanels

2008-08-11 Thread Troy S
R Gurus-- I am trying to adopt this code. I do not care about colors, but would like the data in the upper plots jittered. Here is what I have. So far, the lower squares are blank. Troy print(splom(foo, upper.panel = function(x, y, ...) {panel.splom(jitter(x), jitter(y), ...)}, l

Re: [R] dynamically extract data from a list

2008-08-11 Thread Gabor Grothendieck
Try this: > e <- expression(Sepal.Width > 4) > subset(iris, eval(e), select = "Sepal.Length") Sepal.Length 16 5.7 33 5.2 34 5.5 > subset(iris, eval(e)) Sepal.Length Sepal.Width Petal.Length Petal.Width Species 16 5.7 4.4 1.5 0.4 s

Re: [R] model mix problem. FALSE CONVERGENCE

2008-08-11 Thread Spencer Graves
Hello: I have not seen a reply to this email, so I will offer a couple of suggestions. The error "false convergence" often means that the model is overparameterized. Sometimes, specifying lme(..., control = list(returnObject=TRUE)) will convert this type of error into a warning. If th

[R] dynamically extract data from a list

2008-08-11 Thread Dries Knapen
Hi, Based on user input, I wrote a function that creates a list which looks like: > str(list) List of 4 $ varieties: chr [1:12] "temp.26_time.5dagen_biorep.1" "time. 5dagen_temp.26_biorep.2" "temp.18_time.5dagen_biorep.1" "temp.18_time. 5dagen_biorep.2" ... $ temp : Factor w/ 2 level

Re: [R] Exporting a list of lists

2008-08-11 Thread Gabor Grothendieck
Try this: L <- list(list(Sku = "1", Shape = 1, Scale = 1, DayOfYear = 1:3), list(Sku = "2", Shape = 2, Scale = 2, DayOfYear = 2:3)) f <- function(x) { x$DayOfYear <- paste(x$DayOfYear, collapse = ","); x } write.table(do.call(rbind, lapply(L, f)), sep = ",", row.names = FALSE, file = "")

Re: [R] number of an element in a matrix

2008-08-11 Thread Horace Tso
My last email went out faster than I could think. Actually no need to coerce a matrix to a vector. x = matrix(sample(1:10, 100, replace=T), ncol=10) table(x) H -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Horace Tso Sent: Monday, August 11, 2008 2:

[R] ANNOUNCEMENT: 20% Discount on Books from Chapman & Hall/CRC Press!

2008-08-11 Thread Thomas, Judy
ANNOUNCEMENT: 20% Discount on Books from Chapman & Hall/CRC Press! SPECIAL 20% OFF NEW R BOOKS FROM CHAPMAN & HALL/CRC Use discount code 952HW to take advantage of these special offers. Chapman & Hall/CRC is pleased to provide our latest titles on R at a 20% discount. And that's all you wi

Re: [R] Exporting a list of lists

2008-08-11 Thread rkevinburton
I tried: cat("Sku,Shape,Scale,DayOfYear", file="SkuSalesInfo.dat", append=FALSE); for(i in 1:length(mlist)) { cat(mlist[[i]]$Sku, ",", mlist[[i]]$Shape, ",", mlist[[i]]$Scale, file="SkuSalesInfo.dat", append=TRUE) for(j in 1:length(mlist[[i]]$DayOfYear)) { cat(",", mlist[[i]]$D

Re: [R] ggplot2 font size problem

2008-08-11 Thread hadley wickham
On Mon, Aug 11, 2008 at 1:24 PM, dhzdhz <[EMAIL PROTECTED]> wrote: > > x=c("abcdefghijklmn", "opqrstuvwxyz") > y=c(1, 2) > df=data.frame(name=x, value=y) > p=ggplot(df, aes(name, value))+geom_point() > grid.gedit(gPath("xaxis"), gp=gpar(fontsize=8)) > print(p) > > It doesn't work. I have to print(p

Re: [R] A comprehensive manual on "How to plot" (a lot of graphical examples welcome)

2008-08-11 Thread Greg Snow
In addition to the books mentioned, the 'tkexamp' function in the 'TeachingDemos' package lets you create a plot, then change the plotting parameters using gui controls to see what effect that has on the plot. The examples on the help page show how to do this for some of the standard parameter

Re: [R] tkentry that exits after RETURN?

2008-08-11 Thread Barry Rowlingson
2008/8/11 Ben Bolker <[EMAIL PROTECTED]>: > > I can set up an entry widget (thanks to an old > post by Barry Rowlingson) that gets a password and > exits when the user clicks on the "OK" button. Who? Oh dear, my past comes back to haunt me... > getPassword <- function(){ > require(tcltk) >

Re: [R] ANOVA help

2008-08-11 Thread Gareth Campbell
I've checked the function code and the error is returned form the following: if (rss.qr$rank < ncol(resid)) stop(gettextf("residuals have rank %d < %d", rss.qr$rank, ncol(resid)), domain=NA) I read this as " If the Residual sums of squares $ rank ... " whatever that is " is less than the numb

Re: [R] variance covariance matrix of parameter estimate using nlrq

2008-08-11 Thread roger koenker
mea culpa: I've not written an extractor for this, so you have to do f <- nlrq(whatever) g <- summary(f) g$cov Note that this is computed by resampling so it varies somewhat depending on the seed. url:www.econ.uiuc.edu/~rogerRoger Koenker email[EM

Re: [R] ANOVA help

2008-08-11 Thread Gareth Campbell
Thanks for that, the error I get when I use manova is this: Error in summary.manova(fit) : residuals have rank 30 < 31 What does this mean?? When I call the formula I get 31 residuals and 31 residual standard errors. Not sure why I get this error? Thanks Gareth 2008/8/11 S Ellison <[EMAIL PR

Re: [R] tkentry that exits after RETURN?

2008-08-11 Thread Barry Rowlingson
2008/8/11 Ben Bolker <[EMAIL PROTECTED]>: > > I can set up an entry widget (thanks to an old > post by Barry Rowlingson) that gets a password and > exits when the user clicks on the "OK" button. Who? Oh dear, my past comes back to haunt me... > getPassword <- function(){ > require(tcltk) >

Re: [R] Exporting a list of lists

2008-08-11 Thread rkevinburton
I would like to read it (the data) iinto a different application (not 'R'). Within 'R' I can mlist[[1]] > mlist[1] [[1]] [[1]]$Sku [1] "0" [[1]]$Shape [1] 250.0586 [[1]]$Scale [1] 91.9914 [[1]]$DayOfYear [1] 250 OR mlist[[2]] > mlist[[2]] $Sku [1] "18" $Shape [1] 178.9637 $Scale [1] 58

Re: [R] tkentry that exits after RETURN?

2008-08-11 Thread Barry Rowlingson
2008/8/11 Ben Bolker <[EMAIL PROTECTED]>: > > I can set up an entry widget (thanks to an old > post by Barry Rowlingson) that gets a password and > exits when the user clicks on the "OK" button. Who? Oh dear, my past comes back to haunt me... > getPassword <- function(){ > require(tcltk) >

Re: [R] how can I do this sum?

2008-08-11 Thread Roland Rau
dott wrote: Hi, Suppose I have a vector in real number (x1, x2, x3, x4, x5, x6) My question is how I can get x5*x3*x1 + x6*x4*x2 ? Thanks a lot. Dot. hard to say what you mean? Maybe summing up all elements in odd positions and the ones in even positions? myvector <- 1:6 1*3*5 + 2*4*6

[R] Larger Fonts for x/y-axis

2008-08-11 Thread Andreas Tille
HI, I guess's a FAW, but I'm currently very busy preparing a talks at DebConf and hope you might excuse that my quick search failed. SO please what is the trick to get larger fonts for Graphs to make a good slide for presentations? Sorry for bothering you with this boring question Andreas

Re: [R] number of an element in a matrix

2008-08-11 Thread Horace Tso
How about x = matrix(sample(1:10, 100, replace=T), ncol=10) table(as.vector(x)) -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of rostam shahname Sent: Monday, August 11, 2008 1:42 PM To: r-help@r-project.org Subject: [R] number of an element in a matrix

Re: [R] Compiling only some C files

2008-08-11 Thread Lafaye de Micheaux Pierre
Dear Duncan, Thanks for these precisions. In fact, i am planning to make an R package which will help users to conduct simulation studies for hypothesis tests. The results will consist in a LaTeX table containing the power of different test statistics for different n values and alternative di

[R] Covariance structure determination when lmer has false convergence.

2008-08-11 Thread Todd Remund
I have fit a model with a more complex covariance structure, but the fit reports a false convergence. I have read from past posts that this can be an indication of over-specification. I went ahead and fit a model with a simpler covariance structure. It doesn't seem like I can compare the two

[R] help.search warning?

2008-08-11 Thread Dong-hyun Oh
Dear useRs, When I executed help.search(), I got nothing other than the following warning message. R> help.search("print") Error in help.search("print") : (converted from warning) removing all entries with invalid multi- byte character data I am using Leopard 10.5.4 and R-2.7.1. How to s

Re: [R] number of an element in a matrix

2008-08-11 Thread Henrique Dallazuanna
Try this: mat <- matrix(sample(1:50, 100, rep = TRUE), 10) table(mat)[which(table(mat) == 2)] On 8/11/08, rostam shahname <[EMAIL PROTECTED]> wrote: > Hi, I wonder if there is any function which gives the number of times which > an element is repeated in the matrix. Let say there is a matrix, I w

Re: [R] How to repress the annoying complains from X window system

2008-08-11 Thread Adrian Dusa
On Monday 11 August 2008, Patrick Connolly wrote: > On Sat, 09-Aug-2008 at 04:06PM -0700, dusa.adrian wrote: > > [...] > > |> Warning in structure(.External("dotTclObjv", objv, PACKAGE = "tcltk"), > |> class = "tclObj") : > |> X11 protocol error: BadWindow (invalid Window parameter) > |> > |> > R

[R] help with objects

2008-08-11 Thread andrest
Hi, just started using R and I have the following question. I have a sample code which is structured as Object: histcv1()#apparently not part of the code, but still meaningful somehow function(x, e, w, n, y, br) { #some functions and commands #... return(value) } An

Re: [R] how can I do this sum?

2008-08-11 Thread Rolf Turner
On 12/08/2008, at 7:09 AM, dott wrote: Hi, Suppose I have a vector in real number (x1, x2, x3, x4, x5, x6) My question is how I can get x5*x3*x1 + x6*x4*x2 ? v <- c(x1, x2, x3, x4, x5, x6) m <- matrix(v,ncol=3) sum(apply(m,1,prod)) This could easily be ``generalize

[R] Merging data in long and Broad form

2008-08-11 Thread segun ogundimu
Dear R-help mailing list,   I have the following types of data   long form a<- ID   Y    1 3  1 4 1     5  2     3 2    1 2    4      the broad form data is e<- e0   e1   e2   e3   3    1 3    4   3    2 3    4  I want t

Re: [R] number of an element in a matrix

2008-08-11 Thread Roland Rau
Hi, Brandon Invergo wrote: You can use the length() and which() functions for that: > length(which(m == 2)) Or even shorter since TRUE Values have a value of 1 mymatrix <- matrix(sample(x=1:10, size=1000, replace=TRUE), ncol=5) sum(mymatrix==2) length(which(mymatrix==2)) #should give the sam

[R] variance covariance matrix of parameter estimate using nlrq

2008-08-11 Thread kate
In "lm" command, we can use "vcov" option to get variance-covariance matrix. Does anyone know how to get variance-covariance matrix in nlrq? Thanks, Kate [[alternative HTML version deleted]] __ R-help@r-project.org mailing list https://stat.et

Re: [R] Compiling only some C files

2008-08-11 Thread Lafaye de Micheaux Pierre
Thank you very much! This is an easy and very effective solution. Thanks again, Pierre Barry Rowlingson a écrit : > 2008/8/11 Lafaye de Micheaux Pierre > <[EMAIL PROTECTED]>: > >> Thank you Barry, >> >> In fact, these are only C files (not C++) and i use the extern "C" >> directive. >> >> I

Re: [R] how to save an R object selectively?

2008-08-11 Thread Rolf Turner
On 11/08/2008, at 9:57 PM, carol white wrote: Thanks for your replies. So there is no way to add one or more objects to the existing objects stored in .RData? Not really. There is no ``append=TRUE'' argument for save(). There is a workaround, of course. There [almost] al

Re: [R] ggplot2 font size problem

2008-08-11 Thread dhzdhz
x=c("abcdefghijklmn", "opqrstuvwxyz") y=c(1, 2) df=data.frame(name=x, value=y) p=ggplot(df, aes(name, value))+geom_point() grid.gedit(gPath("xaxis"), gp=gpar(fontsize=8)) print(p) It doesn't work. I have to print(p) before I change the font size. Furthermore, this change will be overwritten by de

[R] Computation of pD in R2WinBUGS

2008-08-11 Thread Nanye Long
Hi all, About how R2WinBUGS computes pD (effective number of parameters), in the manual it says that pD = var(deviance)/2. However, I run some data set and find that the reported pD not equal to var(deviance)/2, but much smaller than that. Is var(deviance)/2 the actual formular used in R2WinBUGS,

[R] tkentry that exits after RETURN?

2008-08-11 Thread Ben Bolker
I can set up an entry widget (thanks to an old post by Barry Rowlingson) that gets a password and exits when the user clicks on the "OK" button. Anyone have any clever ideas for returning/ destroying the window when the user types a carriage return/ENTER in the text window? I've messed arou

Re: [R] R-help? how to take difference in next two elements

2008-08-11 Thread dott
Thanks all for the help, that is done. Gabor Grothendieck wrote: > > Here are a couple of ways: > >> tail(a, -2) - head(a, -2) > [1] 2 5 -3 >> c(ts(a) - lag(ts(a), -2)) > [1] 2 5 -3 > > > On Mon, Aug 11, 2008 at 11:26 AM, dott <[EMAIL PROTECTED]> wrote: >> >> Hi, >> >> I'd like to take d

Re: [R] Compiling only some C files

2008-08-11 Thread Lafaye de Micheaux Pierre
Dear Duncan, Thanks for these precisions. In fact, i am planning to make an R package which will help users to conduct simulation studies for hypothesis tests. The results will consist in a LaTeX table containing the power of different test statistics for different n values and alternative di

[R] how can I do this sum?

2008-08-11 Thread dott
Hi, Suppose I have a vector in real number (x1, x2, x3, x4, x5, x6) My question is how I can get x5*x3*x1 + x6*x4*x2 ? Thanks a lot. Dot. -- View this message in context: http://www.nabble.com/how-can-I-do-this-sum--tp18931693p18931693.html Sent from the R help mailing list archive at Nabbl

Re: [R] Compiling only some C files

2008-08-11 Thread Lafaye de Micheaux Pierre
Thank you Barry, In fact, these are only C files (not C++) and i use the extern "C" directive. I would prefer not to rename the files because many of these files serve also in other projects where they should have the .cpp extension I would also not like to merge all the *.cpp files in one uniq

[R] Simple lme/lmer random effects questions

2008-08-11 Thread Brandon Invergo
Hello, I have two very rudimentary questions regarding the random effects terms in the lme and lmer functions. I apologize if this also partly strays into a general statistics question, but I'm a bit new to this all. So hopefully it'll be a quick problem to sort out... Here is my experimenta

Re: [R] number of an element in a matrix

2008-08-11 Thread Brandon Invergo
You can use the length() and which() functions for that: > length(which(m == 2)) cheers, brandon rostam shahname wrote: Hi, I wonder if there is any function which gives the number of times which an element is repeated in the matrix. Let say there is a matrix, I would like to find out how man

Re: [R] Exporting a list of lists

2008-08-11 Thread jim holtman
What do you want to do with the data? Are you just storing it to read in it later? Have you looked at 'save/load'? If you want a character representation, try 'dput'; this can be read back in with 'source'. So it all depends on what you are planning to do with it. On Mon, Aug 11, 2008 at 4:14 P

[R] number of an element in a matrix

2008-08-11 Thread rostam shahname
Hi, I wonder if there is any function which gives the number of times which an element is repeated in the matrix. Let say there is a matrix, I would like to find out how many times number 2 has been repeated in the matrix, or in other words, how many elements of the matrix are equal 2. Thanks for y

Re: [R] Exporting a list of lists

2008-08-11 Thread Roland Rau
Hi Kevin, check ?dump set.seed(1234) list1 <- list(a1=rnorm(100), a2=rnorm(10)) list2 <- list(a1=rnorm(50), a2=rnorm(25)) mylist <- list(top1=list1, top2=list2) dump(list="mylist", file="mydumpedlist.r") rm(mylist) # please note that you have to quote the name # of the object(s) you want to du

Re: [R] How to repress the annoying complains from X window system

2008-08-11 Thread Patrick Connolly
On Sat, 09-Aug-2008 at 04:06PM -0700, dusa.adrian wrote: [...] |> Warning in structure(.External("dotTclObjv", objv, PACKAGE = "tcltk"), class |> = "tclObj") : |> X11 protocol error: BadWindow (invalid Window parameter) |> |> > R.version |>_ |> platform i486-pc-linux-gnu

Re: [R] T Test

2008-08-11 Thread Erik Iverson
Just plug your values into the t-test formula, you don't need R for this, you can use a calculator. If you want a p-value then use the pt() function in R after getting the t statistic. Angelo Scozzarella wrote: Hi, I want to calculate the T-Test from means and sd. How can I do it? Thanks

Re: [R] T-test

2008-08-11 Thread Rolf Turner
On 12/08/2008, at 3:11 AM, Angelo Scozzarella wrote: How can I make a t-test if I haven't got all data set but I know the numbers of subjects for each group, the mean and di standard deviation for each group? Use your head. I.e. do the same thing you'd do if you weren't using a compute

[R] T Test

2008-08-11 Thread Angelo Scozzarella
Hi, I want to calculate the T-Test from means and sd. How can I do it? Thanks Angelo Scozzarella __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting guide http://www.R-project.org/posting-guid

[R] Exporting a list of lists

2008-08-11 Thread rkevinburton
I have a list List(Sku=" ", Shape=1, Scale=3, DayOfYear=daylist) Note: picture daylist as c(2,3,4,3) it is a list with variable length. Then I have a list of lists al <- c(al, List(List(Sku=" ", Shape=1, Scale=3, DayOfYear=daylist)) Note: same comment on daylist as above. So far this creates a

Re: [R] Compiling only some C files

2008-08-11 Thread Duncan Murdoch
Barry Rowlingson wrote: 2008/8/11 Lafaye de Micheaux Pierre <[EMAIL PROTECTED]>: Thank you Barry, In fact, these are only C files (not C++) and i use the extern "C" directive. I would prefer not to rename the files because many of these files serve also in other projects where they should h

Re: [R] A comprehensive manual on "How to plot" (a lot of graphical examples welcome)

2008-08-11 Thread Roy Mendelssohn
Hi: 2008/8/11 Zroutik Zroutik <[EMAIL PROTECTED]>: Yes! This is a type of manual I was looking for. Thank you so much. I see I'll spend the whole night "out-sourcing" ideas and possibilities :D On Mon, Aug 11, 2008 at 2:53 PM, Ben Tupper <[EMAIL PROTECTED]>wrote: Look at: http://a

[R] generating a random signal with a known correlation

2008-08-11 Thread Yasir Kaheil
Hi, How can I generate a random signal that's correlated with a given signal at a given correlation (say 0.7)? I've been looking at rmvnorm etc but don't seem to figure it out. Thanks - Yasir H. Kaheil Columbia University -- View this message in context: http://www.nabble.com/generating-a-

Re: [R] how can I do this sum?

2008-08-11 Thread Ben Bolker
dott gmail.com> writes: > > > Matlab has .*, so that > t(x1,x2).*t(x3,x4).* t(x5,x6) > > but what is .* in R? > > Thanks. > Dot. > Element-wise multiplication is just * in R (do you really mean "sum" or is that a general expression for "calculation"?) See also http://wiki.r-projec

Re: [R] how can I do this sum?

2008-08-11 Thread markleeds
if you mean matrix multiplication, it's %*% but i'm not sure if that's what you meant by below ? On Mon, Aug 11, 2008 at 3:44 PM, dott wrote: Matlab has .*, so that t(x1,x2).*t(x3,x4).* t(x5,x6) but what is .* in R? Thanks. Dot. -- View this message in context: http://www.nabble.com/how-c

Re: [R] how can I do this sum?

2008-08-11 Thread dott
Matlab has .*, so that t(x1,x2).*t(x3,x4).* t(x5,x6) but what is .* in R? Thanks. Dot. -- View this message in context: http://www.nabble.com/how-can-I-do-this-sum--tp18931693p18932274.html Sent from the R help mailing list archive at Nabble.com.

Re: [R] A comprehensive manual on "How to plot" (a lot of graphical examples welcome)

2008-08-11 Thread John C Frain
You might also have a look at Maindonald and Braun (2007) Data Analysis and Graphics Using R, 2nd edition, Cambridge. The web site for the book has R code for the illustrations in the book. Best Regards John 2008/8/11 Zroutik Zroutik <[EMAIL PROTECTED]>: > Yes! This is a type of manual I was lo

Re: [R] R-help? how to take difference in next two elements

2008-08-11 Thread Bert Gunter
Please use R's help resources before posting. help.search("difference") will give you your answer (?diff). -- Bert Gunter Genentech -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of dott Sent: Monday, August 11, 2008 8:27 AM To: r-help@r-project.org Subje

[R] checking if multinom converged

2008-08-11 Thread markleeds
Is anyone aware of a way to check whether multinom has converged by checking a component of the output ? I'm not familar with nnet but, since multinom calls nnet , maybe there is an extra argument once can send to multinom to capture this information. Thanks. ___

Re: [R] Differential Equations there use in R (population modeling)

2008-08-11 Thread Roland Rau
Hi, stephen sefick wrote: e1 <- function(x,b,t){ d<-(x)*(b^t) plot(d) } e1(2, 2,seq(from=0, to=6, by=1)) Is there a way to do this with a change in time. I would like to use differential equations. I am trying to model a population with an initial value, fecundity per time st

Re: [R] Differential Equations there use in R (population modeling)

2008-08-11 Thread Ben Bolker
There was a spurious tilde in the code coming from my digital signature -- oops. ignore the tilde in the function: library(odesolve) ## in general x, b are state and parameter VECTORS e1B <- function(t,x,b) { list(x*b^t,NULL) } L1 = lsoda(y=1,times=seq(0,1,by=0.02),func=e1B,parms=c(b=0.

Re: [R] Differential Equations there use in R (population modeling)

2008-08-11 Thread stephen sefick
thanks On Mon, Aug 11, 2008 at 2:18 PM, Ben Bolker <[EMAIL PROTECTED]> wrote: > > There was a spurious tilde in the code coming > from my digital signature -- oops. ignore the > tilde in the function: > > library(odesolve) > > ## in general x, b are state and parameter VECTORS > e1B <- function(

[R] Peoblem with nls and try

2008-08-11 Thread jarod_v6
Hello, I can`t figure out how can increase the velocity of the fitting data by nls. I have a long data .csv I want to read evry time the first colunm to the other colunm and analisy with thata tools setwd("C:/dati") a<-read.table("Normalizzazione.csv", sep=",", dec=".", header=F) for (i in 1:di

[R] Peoblem with nls and try

2008-08-11 Thread jarod_v6
Hello, I can`t figure out how can increase the velocity of the fitting data by nls. I have a long data .csv I want to read evry time the first colunm to the other colunm and analisy with thata tools setwd("C:/dati") a<-read.table("Normalizzazione.csv", sep=",", dec=".", header=F) for (i in 1:di

Re: [R] Differential Equations there use in R (population modeling)

2008-08-11 Thread stephen sefick
error in isoda(y = 1, times = seq(0, 1, by = 0.02), func = e1B, parms = c(b = 0.9)) : Model function must return a list this is the error message I get when I try and paste in the code. Stephen Sefick On Mon, Aug 11, 2008 at 1:36 PM, Ben Bolker <[EMAIL PROTECTED]> wrote: > -BEGIN PGP SIGNE

Re: [R] Link to newest R GUI

2008-08-11 Thread Michael Lawrence
On Mon, Aug 11, 2008 at 9:27 AM, <[EMAIL PROTECTED]> wrote: > I have used Rattle ( R Analytical tool to learn easily )and R > Commander and found them to be quite good. I don't use the command > line interface because I find it too time consuming from other > languages like SAS,SPSS. I am not sure

Re: [R] detect if data is normal or skewed (without a boxplot)

2008-08-11 Thread Felipe Carrillo
Thanks Jim and Ben for your replies, Reading further about data normalization found shapiro.test. I understand that if the p-value is smaller than 0.05 then the data isn't normal, I just don't understand what the "W" means. Hi Felipe, Here's one way: library(nortest) if(sf.test(fishlength)$p

[R] Peoblem with nls and try

2008-08-11 Thread jarod_v6
Hello, I can`t figure out how can increase the velocity of the fitting data by nls. I have a long data .csv I want to read evry time the first colunm to the other colunm and analisy with thata tools setwd("C:/dati") a<-read.table("Normalizzazione.csv", sep=",", dec=".", header=F) for (i in 1:di

[R] Peoblem with nls and try

2008-08-11 Thread jarod_v6
Hello, I can`t figure out how can increase the velocity of the fitting data by nls. I have a long data .csv I want to read evry time the first colunm to the other colunm and analisy with thata tools setwd("C:/dati") a<-read.table("Normalizzazione.csv", sep=",", dec=".", header=F) for (i in 1:di

[R] Code for residuals from a lowess curve?

2008-08-11 Thread SHAW J.R.
Hi, I'm completely new to R and am struggling with producing residuals from a lowess curve. I have looked at the pdf help pages and searched online and have tried the following code: > l.agebl <- lines(lowess(agebl, f=.5)) > resid(l.agebl) > resid(lowess(agebl, f=.5)) NULL > residuals(lowess

Re: [R] : bquote inside legend()

2008-08-11 Thread Monica Pisica
Thanks, this certainly works as well, especially the "second" legend syntax. Monica > Date: Mon, 11 Aug 2008 18:08:02 +0100 > From: [EMAIL PROTECTED] > To: [EMAIL PROTECTED] > CC: r-help@r-project.org > Subject: Re: [R] : bquote inside legend() > > Perhaps you want > > val <- substitute("value"

Re: [R] Differential Equations there use in R (population modeling)

2008-08-11 Thread Ben Bolker
-BEGIN PGP SIGNED MESSAGE- Hash: SHA1 stephen sefick wrote: | population# = (initialvalue @ t) - (death rate) + (fecundtity per individual) dt | to be able to vary the values of the inputs death rate and fecundity | with time using initial value @ t from the previous time step to | eval

Re: [R] Compiling only some C files

2008-08-11 Thread Barry Rowlingson
2008/8/11 Lafaye de Micheaux Pierre <[EMAIL PROTECTED]>: > Thank you Barry, > > In fact, these are only C files (not C++) and i use the extern "C" > directive. > > I would prefer not to rename the files because many of these files serve > also in other projects where they should have the .cpp exten

Re: [R] Add arrows to a filled.contour margin

2008-08-11 Thread Greg Snow
The problem is that the coordinate system after the call to filled.contour is not the same as used to create the contour plot. There are a couple of ways to do what you want. 1. use the plot.axes argument (see the help page and the examples) and have that plot the arrows as part of the call.

Re: [R] Are there any guis out there, which will allow editing of the graph?

2008-08-11 Thread Greg Snow
Just to add a couple more thougths to this thread. If you go the xfig driver route, there are also the programs jfig and winfig that edit fig files and may be easier to install on some platforms (winfig may require a payment to get full use, but I believe jfig is free). But you may want to thi

Re: [R] : bquote inside legend() - TANKS!

2008-08-11 Thread stephen sefick
entities must not be multiplied beyond necessity On Mon, Aug 11, 2008 at 1:05 PM, Monica Pisica <[EMAIL PROTECTED]> wrote: > > Hi, > > Thanks so much, i even don't know why i felt the compulsion to complicate > myself with the legend and bquote ;-) Fancy code is not necessarily the best > - i ma

Re: [R] : bquote inside legend()

2008-08-11 Thread Prof Brian Ripley
Perhaps you want val <- substitute("value" == a, list(a = a)) legend(6, 5, do.call("expression", list("Legend", val)), bty = 'n') ? Your first attempt is a character vector and your second fixed up quote and substitute. But more likely would be legend(6, 20, val, bty="n", title="Legend")

Re: [R] : bquote inside legend() - TANKS!

2008-08-11 Thread Monica Pisica
Hi, Thanks so much, i even don't know why i felt the compulsion to complicate myself with the legend and bquote ;-) Fancy code is not necessarily the best - i may say! Again, thanks, Monica > Date: Mon, 11 Aug 2008 12:49:04 -0400 > From: [EMAIL PROTECTED] > To: [EMAIL PROTECTED] > Subject: R

Re: [R] RPro

2008-08-11 Thread Roland Rau
Charles C. Berry wrote: Should someone start a pool on when SAS will offer 'R language support' ?? At least Biostatistics Denmark developed something in this direction. Too bad that Rolf Poalis made only this announcement: http://tolstoy.newcastle.edu.au/R/help/04/04/0009.html in the beginning

Re: [R] ggplot2 font size problem

2008-08-11 Thread hadley wickham
Hi dhzdhz, There's currently no particularly easy way to do this. It is possible to use grid to edit these labels directly (see http://had.co.nz/ggplot2/book/grid.pdf), but the next version of ggplot2 will have a more convenient theming system that will make it much easier to make these sorts of

Re: [R] : bquote inside legend()

2008-08-11 Thread stephen sefick
#Code begin: # --- a = 2 # result of a function for example plot(1:10, a*(1:10)) #here you go legend(1, 20, paste("value", "=" , a, sep=" "), title="Legend" ,bty = 'n') val <- substitute("value" ==.(a), list(a = a)) legend(6, 5, do.call("expression",list("Legend", val)), bty = '

Re: [R] detect if data is normal or skewed (without a boxplot)

2008-08-11 Thread Ben Bolker
Felipe Carrillo yahoo.com> writes: > > Hello all: > Is there a way to detect in R if a dataset is normally distributed or skewed without graphically seeing it? > The reason I want to be able to do this is because I have developed and application with Visual Basic where > Word,Access and Excel "t

Re: [R] ggplot2 font size problem

2008-08-11 Thread stephen sefick
I can't reproduced this (function aes), but have you looked at ?par cex cex.axis (and so on) On Mon, Aug 11, 2008 at 11:55 AM, dhzdhz <[EMAIL PROTECTED]> wrote: > > How do I change the font size of the label in ggplot. For example > > x=c("abcdefghijklmn", "opqrstuvwxyz") > y=c(1, 2) > df=data.fra

[R] : bquote inside legend()

2008-08-11 Thread Monica Pisica
Hi, I have a graph and I would like to write some values inside the legend that were saved in a variable. Please revise the code below in which I've wrote 2 different legends, but I am not happy with either of them. What I want is a legend with tile "Legend" and underneath a line with a name a

Re: [R] Prediction confidence intervals for a Poisson GLM

2008-08-11 Thread Prof Brian Ripley
Confidence intervals for what? For a Poisson glm() you can predict the mean response or the linear predictor, and they are not the same (unlike a linear model). I suggest you predict the linear predictor (the default), use the s.e.s to for a confidence interval and then if desired transform (

Re: [R] Link to newest R GUI

2008-08-11 Thread ohri2007
I have used Rattle ( R Analytical tool to learn easily )and R Commander and found them to be quite good. I don't use the command line interface because I find it too time consuming from other languages like SAS,SPSS. I am not sure on Vista compatibility though. The Rattle log file auto generates t

Re: [R] R-help? how to take difference in next two elements

2008-08-11 Thread Gabor Grothendieck
Here are a couple of ways: > tail(a, -2) - head(a, -2) [1] 2 5 -3 > c(ts(a) - lag(ts(a), -2)) [1] 2 5 -3 On Mon, Aug 11, 2008 at 11:26 AM, dott <[EMAIL PROTECTED]> wrote: > > Hi, > > I'd like to take difference for a sequence a between a_i and a_i-2, for > instance, > a<-c(2,3,4,8,1) > I nee

  1   2   >