[R] data frame

2010-06-17 Thread n.via...@libero.it
Dear list, I have the following problem. I have a data frame like this CLUSTERYEAR variableDelta R_pivot M1 2005 EC01 NA NA M1 2006 EC012

[R] Subtraction of group means using AGGREGATE and MERGE

2010-06-17 Thread Ben Cocker
Hi all, This is my first ever post, so forgive me and let me know if my etiquette is less than that required. I am searching for a faster way of subracting group means within a data frame than the solution I've found so far, using AGGREGATE and MERGE. I'll flesh my question out using a trivial e

Re: [R] qplot

2010-06-17 Thread ONKELINX, Thierry
Dear Line, Have at look at ?scale_colour_manual() HTH, Thierry ir. Thierry Onkelinx Instituut voor natuur- en bosonderzoek team Biometrie & Kwaliteitszorg Gaverstraat 4 9500 Geraardsbergen Belgium Research Institute

Re: [R] Sampling with replacement

2010-06-17 Thread Jim Lemon
On 06/17/2010 03:27 AM, Somnath Somnath wrote: Thanks for all those reply. Is there any general rule to determine how many samples I would get from a population of size "n", I draw a sample of size "m" ("m" may be greater than "n") if sample is drawn with replacement? Hi Somnath, If you mean "h

[R] Multiple plots in a single page and stripplot()

2010-06-17 Thread Lars Karlsson
I want to make a 2x2 plot on a single page, using stripplot() and boxplot(). I tried the following two alternatives with mfrow() and layout(), but none of them worked. library(lattice) par(mfrow=c(2,2)) boxplot(X1 ~ Y, data=tst1, horizontal=T, las=1) boxplot(X2 ~ Y, data=tst1, horizontal=T, las=1)

Re: [R] Multiple plots in a single page and stripplot()

2010-06-17 Thread Joris Meys
Hi Lars Stripplot is defunct in R 2.10 and following releases, so I wonder a bit why you would still insist on using it. Your code will not be compatible with newer R versions, so I suggest you use stripchart instead (and maybe update your R as well). Cheers Joris On Thu, Jun 17, 2010 at 9:27

Re: [R] how to use sapply code

2010-06-17 Thread Patrick Burns
I believe you have received advice on how to solve your problem already, this is just to say why your 'sapply' call failed. Your call to 'sapply' assumes that there is a 'bt_m' argument to the function, which there isn't. Another problem might be that there is an 'alp' argument but that is not g

[R] Column name defined by function variable

2010-06-17 Thread Ralf B
Hi all, probably a simple problem for you but I am stuck. This simple function adds columns (with differing length) to data frames: add.col <- function(df, new.col) { n.row <- dim(df)[1] length(new.col) <- n.row cbind(df, new.col) } Now I would like to extend that method

Re: [R] Column name defined by function variable

2010-06-17 Thread Ivan Calandra
Hi, I haven't check much of what you wrote, so just a blind guess. What about in the function's body before cbind(): names(new.col) <- "more stuff" ? HTH, Ivan Le 6/17/2010 11:09, Ralf B a écrit : Hi all, probably a simple problem for you but I am stuck. This simple function adds columns (

Re: [R] Subtraction of group means using AGGREGATE and MERGE

2010-06-17 Thread Joris Meys
Funny, I couldn't run your code using R 2.10.1 (aggregate required a list). This said, take a look at the function ave() : > X <- rep(1:4) > Y <- rep(letters[1:2],each=2) > Z <- data.frame(X,Y) > system.time(replicate(1000,{ + A <- aggregate(Z$X, by=list(Y=Z$Y), FUN=mean) + M <- merge(Z,A,b

[R] Testing for differences between 2 unknown distributions/densities

2010-06-17 Thread Ralf B
Hi all, I have two distributions / densities (drew density plots and eye-balled some data). Given that I don't want to make any assumptions about the data (e.g. normality, existence of certain distribution types and parameters), what are my options for testing that the distributions are the same?

[R] trigonometric regression

2010-06-17 Thread William Simpson
Suppose I do a trigonometric regression fit<-lm(y~ cf + sf) where cf and sf are the cos and sine components. b<-coef(fit) I have the fitted sine component b[2] and the cos component b[3]. Doing summary(fit) gives me the p-values and SEs for b[2] and b[3]. But I want the amplitude of the fitted wa

Re: [R] Column name defined by function variable

2010-06-17 Thread Ralf B
Sorry, its late and I am getting tired ;) I modified based on your suggestion: #combine data add.col <- function(df, new.col, name) { n.row <- dim(df)[1] length(new.col) <- n.row names(new.col) <- name cbind(df, new.col) } data <- data.frame(stuff1=as.numeric(d2$p

Re: [R] Too many columns with prelim.norm

2010-06-17 Thread Ted Harding
On 17-Jun-10 05:42:42, rockclimber112...@gmail.com wrote: > -Original Message- > From: rockclimber112...@gmail.com > Date: Wed, 16 Jun 2010 23:38:49 > To: > Reply-To: rockclimber112...@gmail.com > Subject: Too many columns with prelim.norm > > Hi everyone, > > I'm trying to use prelim.n

Re: [R] Multiple plots in a single page and stripplot()

2010-06-17 Thread Deepayan Sarkar
On Thu, Jun 17, 2010 at 12:57 PM, Lars Karlsson wrote: > I want to make a 2x2 plot on a single page, using stripplot() and boxplot(). > I tried the following two alternatives with mfrow() and layout(), but none > of them worked. > > library(lattice) > par(mfrow=c(2,2)) > boxplot(X1 ~ Y, data=tst1,

Re: [R] Column name defined by function variable

2010-06-17 Thread Ivan Calandra
Now that I take a better look at your function, I don't understand everything, but this should work (it works for me, if I understood correctly at least what you're looking for): add.col <- function(df, new.col, name) { n.row <- dim(df)[1] length(new.col) <- n.row test <- cbind(df,

Re: [R] t-test problem

2010-06-17 Thread Worik R
> Sorry, I realized that is is fairly easy to test that it is an issue > with which tail of the distribution you use. This should show what is > going on better than my prior message. > > 1.353946/2 = 0.676973 > 1 - 0.676973 = 0.323027 > 0.323027 * 2 = 0.646054 > > in pt(), the default is lower.ta

Re: [R] trigonometric regression

2010-06-17 Thread Duncan Murdoch
William Simpson wrote: Suppose I do a trigonometric regression fit<-lm(y~ cf + sf) where cf and sf are the cos and sine components. b<-coef(fit) I have the fitted sine component b[2] and the cos component b[3]. Doing summary(fit) gives me the p-values and SEs for b[2] and b[3]. But I want the a

[R] Help with interpolation of time series

2010-06-17 Thread Nicholas R Frazier
I'm quite new to R. I have a time series of annual state population estimates from census.gov, and I'd like to get a time series of monthly estimates, by a nonlinear interpolation. How can I do this in R? Thanks! [[alternative HTML version deleted]]

[R] RKWARD

2010-06-17 Thread n.via...@libero.it
Dear list, I have a question. I have the RKward configuration. I don't know what happened but now when I open R I have in my workspace data frames with which I used in the past sessions.How can I set RKward in order to open a new workspace? Thanks a lot [[alternative HTML version delet

[R] big big problem

2010-06-17 Thread n.via...@libero.it
Dear list, I'll try to be more clear in explaining my problem. I have a data frame like this called X: CLUSTERYEAR variable value1 value2 M1 2005 EC01 NA NA M1

[R] Optimization problem

2010-06-17 Thread José E. Lozano
Hello, I'm facing a problem of optimization, I've already solved but I'm trying to find other answers to this problem to improve the solution. Well, to make it short: I have to set/install a number of devices in a building, and I have to give service to a number of "customers", or better say, to

Re: [R] Testing for differences between 2 unknown distributions/densities

2010-06-17 Thread David Winsemius
On Jun 17, 2010, at 5:17 AM, Ralf B wrote: Hi all, I have two distributions / densities (drew density plots and eye-balled some data). Given that I don't want to make any assumptions about the data (e.g. normality, existence of certain distribution types and parameters), what are my options fo

[R] plotting radial dendrograms

2010-06-17 Thread Carson Farmer
Dear list, I am trying to plot a radial dendrogram using the ape package, which requires my data to be of class 'phylo'. Currently I have my dendrogram stored as an object of class 'dendrogram' which was produced from an outside bit of C code, but was made into an object of class 'igraph.eigenc' a

Re: [R] t-test problem

2010-06-17 Thread David Winsemius
On Jun 17, 2010, at 12:51 AM, Worik R wrote: If it were not for the fact that I get inconsistent results I would be sure that I need... I have not yet seen a proper challenge to your original assumption that the t-statistic should be the same as the p-value. They go in _opposite_ direct

Re: [R] t-test problem

2010-06-17 Thread Oscar Rueda
Hi Worik, You can try 2*pt(abs(t1$statistic), t1$parameter, lower.tail=FALSE) If the test is two sided. Cheers, Oscar Oscar M. Rueda, PhD Postdoc, Breast Cancer Functional Genomics Cancer Research UK Cambridge Research Institute Li Ka Shing Centre Robinson Way Cambridge CB2 0RE England O

Re: [R] trigonometric regression

2010-06-17 Thread William Simpson
Yes, I want the same test as is done for b[1] and b[2] in the summary table -- for H0: b[]==0. OK, do F-test on full model with cf and sf vs reduced model with intercept only. I want to test y~cf + sf vs y~ intercept (ie mean) -- I guess I just use var(y) Thanks Duncan for your help Bill On T

Re: [R] t-test problem

2010-06-17 Thread Ted Harding
On 16-Jun-10 22:30:39, Worik R wrote: > I have two pairs of related vectors > x1,y1 > and > x2,y2 > > I wish to do a test for differences in means of x1 and y1, > ditto x2 and y2. > > I am getting odd results. I am not sure I am using 'pt' properly... > I have not included the raw vectors a

Re: [R] trigonometric regression

2010-06-17 Thread William Simpson
var(y)*length(y) I mean. (SSE) Bill On Thu, Jun 17, 2010 at 1:34 PM, William Simpson wrote: > Yes,  I want the same test as is done for b[1] and b[2] in the summary > table -- for H0: b[]==0. > > OK, do F-test on full model with cf and sf vs reduced model with intercept > only. > I want to test

[R] One graph for each row

2010-06-17 Thread Markus Kohler
Hi all, I have the following data (from a performance test) URL;time;Nr. of Users url1;0.101;1 url10;0.048;1 url2;0.097;10 url2;0.066;10 url3;0.915;30 url3;0.847;30 I want to have one plot for each url (times for 1,10,30 user), contained in *one* graph( one below each other). What is the easi

Re: [R] R and LINGO?

2010-06-17 Thread Martin Maechler
> "b" == brwin338 > on Wed, 16 Jun 2010 19:55:17 -0400 writes: b> Good Evening b> Does anyone in the R-help list have experience writing an R wrapper that interfaces with the commercial packages LINGO and/or LINDO.api from R? b> I have a set of nonlinear/mixed integer p

Re: [R] trigonometric regression

2010-06-17 Thread William Simpson
Got it now. I do anova(lm(y~ 1),lm(y~ cf+sf)) Bill __ 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-guide.html and provide commented, minimal, self-contai

[R] Plotting confidence intervals of two response on same graph (panel).

2010-06-17 Thread Kim Jung Hwa
Hello! I would like to draw a graph like the following: http://www.optics.rochester.edu/workgroups/cml/opt307/spr04/pavel/plot_small.jpg Aim is to plot confidence intervals of treatments for X(=response1) and Y(=response2) axis simultaneously to visualize aggreement of confidence interval for two

[R] RODBC in R

2010-06-17 Thread dhanush
When I am connecting to the server via ODBC I got the following error. >library(RODBC) channel <- odbcConnect("my server", uid="***" , case="*") Error in switch(case, toupper = case <- 1L, tolower = case <- 2L, postgresql = case <- 2L, : Invalid case parameter: nochange | toupper | tolo

[R] R licensing query

2010-06-17 Thread McAllister, Gina
I have recently started a new job at an NHS hospital in Scotland. Since I took up this post 6 months ago I have had an ongoing dispute with the IT secutiry dept. who refuse to install R on my computer. I previously worked in another branch of the NHS where R was widely used and yet there is nothi

Re: [R] working with zoo time index ??

2010-06-17 Thread skan
Hi again. I have several files with data like above. Each file has different periods. My idea is to use zoo in order to do this... Converting all data to same period, the smaller one, 5 minutes. Whenever a datum doesn't exist copy the last one. (carry forward) Add data of every 5 minutes gettin

[R] Help R

2010-06-17 Thread ricardosousa2000
Hello, I'm new in using the R, but from what I read is an excellent tool. Would you like if I could help, I am trying create an array from reading a text file. The idea is to read the file, and transform the data in binary format, for example. The calves of this file fo

[R] simulating data from a multivariate dist

2010-06-17 Thread suman dhara
Sir, I am working on fitting distribution on multivariate financial data and then simulate observations from that fitted distribution. I use stepAIC.ghyp() function of 'ghyp' library which select the best fitted distribution from generalized hyperbolic distribution class on the given dataset. data

Re: [R] data frame

2010-06-17 Thread Sarah Goslee
You've posted this repeatedly, and yet received no answer. Perhaps that is because you haven't read the posting guide! You didn't provide a reproducible example, you didn't tell us where ddply came from, you didn't tell us what was wrong with the code you suggested. It would also be rather easier t

Re: [R] RODBC in R

2010-06-17 Thread Bart Joosen
Hi, case should be tolower, toupper, nochange, not "*" . I think you switched case for pwd? Anyway, you can just use odbConnect("yourODBC connection") to connect to your ODBC db. Bart -- View this message in context: http://r.789695.n4.nabble.com/RODBC-in-R-tp2258510p2258742.html Sen

[R] updating cells

2010-06-17 Thread Daniel
Hello all,I have a table with about 18000 rows, I need to UPDATE the strings in the "name.x" column in each row by the strings from "name.y" given if "name.x" is NA or " ". How can I do it? Also I want to update values in other columns, but I think that will be the same job. Daniel -- Daniel Marce

[R] RODBC: AD authentication when accessing database?

2010-06-17 Thread johannes rara
Hi, I'm trying to fetch data from SQL Server database using RODBC. Is there a way to use AD authentication method when accessing data via R? I'm using R 2.10.1 and Windows XP. -J __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinf

Re: [R] RODBC in R

2010-06-17 Thread Marc Schwartz
On Jun 17, 2010, at 4:48 AM, dhanush wrote: > > When I am connecting to the server via ODBC I got the following error. > >> library(RODBC) > channel <- odbcConnect("my server", uid="***" , case="*") > > Error in switch(case, toupper = case <- 1L, tolower = case <- 2L, postgresql > = case

Re: [R] Plotting confidence intervals of two response on same graph (panel).

2010-06-17 Thread William Revelle
Kim, It is possible that error.crosses in the psych package will do what you want. Bill At 9:25 AM -0400 6/17/10, Kim Jung Hwa wrote: Hello! I would like to draw a graph like the following: http://www.optics.rochester.edu/workgroups/cml/opt307/spr04/pavel/plot_small.jpg Aim is to plot confi

[R] Invitation to a new Q&A statistical-analysis website

2010-06-17 Thread Tal Galili
There is a new initiative to open a community based Q&A website which is based on the StackOverFlow engine - to answer data-analysis (and obviously R) related Questions. After good several months of using StackOverFlow (see the R tagged questions here )

Re: [R] Help R

2010-06-17 Thread Henrique Dallazuanna
Try this: Lines <- "A,B,C,D,G A,C,E,O F,G" x <- read.table(textConnection(Lines), sep = ",", fill = TRUE, colClasses = rep('character', 3)) xtabs( ~ r + values, transform(stack(x), r = rownames(x))) On Thu, Jun 17, 2010 at 7:10 AM, wrote: > > Hello, > I'm new in using the R, but from

Re: [R] Help R

2010-06-17 Thread jim holtman
try this: > x <- textConnection(" A,B,C,D,G + A,C,E,O + F,G") > # assume you read in your data by Lines since not the same number of fields > in each line > input <- readLines(x) > close(x) > # remove blanks that might be there > input <- gsub(' *', '', input) > # split by comma > in.s <- str

[R] Question regarding print

2010-06-17 Thread Adolf STIPS
Hi, Does anybody know how to have output from print, without the leading [1]? (Or must I use cat/write?) >out="r15" >print(out,quote=FALSE) [1] r15 And I definitely do not want the leading [1] as I want to construct a table from this. Ciao, Adolf ---

Re: [R] Help with interpolation of time series

2010-06-17 Thread Gabor Grothendieck
On Thu, Jun 17, 2010 at 6:26 AM, Nicholas R Frazier wrote: > I'm quite new to R.  I have a time series of annual state population > estimates from census.gov, and I'd like to get a time series of monthly > estimates, by a nonlinear interpolation. Please provide some test data in reproducible form

Re: [R] updating cells

2010-06-17 Thread Henrique Dallazuanna
Try this (not tested): x$name.x[is.na(x$name.x) | x$name.x == " "] <- x$name.y[is.na(x$name.x) | x$name.x == " "] On Thu, Jun 17, 2010 at 10:22 AM, Daniel wrote: > Hello all,I have a table with about 18000 rows, I need to UPDATE the > strings > in the "name.x" column in each row by the strings

Re: [R] R licensing query

2010-06-17 Thread Jeff Newmiller
I think there is something else going on here, since no "security" organization would accept an email from a nonexistent organization as justification for adding software that they are suspicious of to their system. On the other hand, if you can't figure out what is really going on, and you can

Re: [R] R licensing query

2010-06-17 Thread Marc Schwartz
On Jun 17, 2010, at 4:28 AM, McAllister, Gina wrote: > I have recently started a new job at an NHS hospital in Scotland. Since > I took up this post 6 months ago I have had an ongoing dispute with the > IT secutiry dept. who refuse to install R on my computer. I previously > worked in another br

Re: [R] Question regarding print

2010-06-17 Thread jim holtman
cat(out, '\n') On Thu, Jun 17, 2010 at 10:19 AM, Adolf STIPS wrote: > > Hi, > > Does anybody know how to have output from print, without the leading [1]? > (Or must I use cat/write?) > >>out="r15" >>print(out,quote=FALSE) > [1] r15 > > And I definitely do not want the leading [1] as I want to con

Re: [R] R licensing query

2010-06-17 Thread Duncan Murdoch
On 17/06/2010 10:26 AM, Jeff Newmiller wrote: I think there is something else going on here, since no "security" organization would accept an email from a nonexistent organization as justification for adding software that they are suspicious of to their system. The R Foundation is not "non

Re: [R] RODBC: AD authentication when accessing database?

2010-06-17 Thread Marc Schwartz
On Jun 17, 2010, at 8:42 AM, johannes rara wrote: > Hi, > > I'm trying to fetch data from SQL Server database using RODBC. Is > there a way to use AD authentication method when accessing data via R? > I'm using R 2.10.1 and Windows XP. > > -J I am not familiar with the use of RODBC in that part

Re: [R] Optimization problem

2010-06-17 Thread Bart Joosen
How about smoothing the percentages, and then take the second derrivative to find the inflection point? which.max(diff(diff((lowess(percentages)$y Bart -- View this message in context: http://r.789695.n4.nabble.com/Optimization-problem-tp2258654p2258828.html Sent from the R help mailing l

Re: [R] RODBC in R

2010-06-17 Thread dhanush
please explain more about "your ODBC connection" as in brackets in your statement. I just masked my password in case using **. Please write complete syntax. Thank you -- View this message in context: http://r.789695.n4.nabble.com/RODBC-in-R-tp2258510p2258814.html Sent from the R help ma

[R] Plotting different symbols in R for different values in a vector

2010-06-17 Thread clips10
I have some point locations I want to add to a plot and have the command pts1<-as.points(Xcoordinate,Ycoordinate) then plot(poly1,type="l",lwd=1) what I want to do is add the locations onto the plot. I can do this using the points command but I have another vector in my data frame with the x

Re: [R] working with zoo time index ??

2010-06-17 Thread skan
What if I use something like myvalue = coredata[ index[x] == as.Date("2009-03-01") ] -- View this message in context: http://r.789695.n4.nabble.com/working-with-zoo-time-index-tp2255804p2258802.html Sent from the R help mailing list archive at Nabble.com. __

[R] Pretty printing progress

2010-06-17 Thread Doran, Harold
I have a function that is an iterative process for estimating some MLEs. I want to print some progress to screen as the process iterates. I would like to try and line things up nicely in the R window, but am not sure the best way to do this. Below is a toy example. Suppose I want the value of 10

Re: [R] Optimization problem

2010-06-17 Thread William Simpson
min(devices[percentages==max(percentages)]) Bill __ 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-guide.html and provide commented, minimal, self-contain

Re: [R] Plotting different symbols in R for different values in a vector

2010-06-17 Thread Sarah Goslee
Take a look at ?par - particularly the options for pch and col. Sarah On Thu, Jun 17, 2010 at 9:55 AM, clips10 wrote: > > I have some point locations I want to add to a plot and have the command > > pts1<-as.points(Xcoordinate,Ycoordinate) > > then > > > plot(poly1,type="l",lwd=1) > > what I wan

Re: [R] big big problem

2010-06-17 Thread Joris Meys
It seems to me you're not aware of what that code is doing. You can easily add the 5 by : ddply(X,.(variable,CLUSTER),transform,series=c(rev(value2[-1]-cumsum(rev(value1[-1]))),rev(value2)[1])) Try to figure out what the code is doing exactly for next time, you'll definitely benefit from it. Chee

Re: [R] Plotting different symbols in R for different values in a vector

2010-06-17 Thread Joris Meys
use the condition and par options, eg : x <- rnorm(10) y <- rnorm(10) A<- x<0 plot(x,y,type="l") points(x[A],y[A],pch=19,col="red") points(x[!A],y[!A],pch=21,col="blue",bg="green",lwd=2,cex=4) cheers Joris On Thu, Jun 17, 2010 at 3:55 PM, clips10 wrote: > > I have some point locations I want to

Re: [R] working with zoo time index ??

2010-06-17 Thread Gabor Grothendieck
On Thu, Jun 17, 2010 at 9:40 AM, skan wrote: > > What if I use something like > myvalue = coredata[ index[x] == as.Date("2009-03-01") ] See ?window.zoo __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the

[R] R user interface

2010-06-17 Thread Shubha Vishwanath Karanth
Hi R, I have a an excel file with a lot of data. I need to create an user interface in R, which has one single screen. It needs to contain a right pane containing the click buttons for different countries (say). If the user clicks a country, then a chart needs to be created for that country, ta

Re: [R] simulating data from a multivariate dist

2010-06-17 Thread Joris Meys
Dirty hack, but it's working. library(MASS) mu <- aic.mv$best.mo...@expected.value sigma <- aic.mv$best.mo...@variance mvrnorm(100,mu,sigma) If you'd like to follow the rules, look for the functions to extract the expected value and the variance of the best model out of the stepAIC.ghyp object.

Re: [R] working with zoo time index ??

2010-06-17 Thread Gabor Grothendieck
On Thu, Jun 17, 2010 at 7:38 AM, skan wrote: > > Hi again. > > > I have several files with data like above. Each file has different periods. > > My idea is to use zoo in order to do this... > Converting all data to same period, the smaller one, 5 minutes. > Whenever a datum doesn't exist copy the

Re: [R] Pretty printing progress

2010-06-17 Thread Barry Rowlingson
On Thu, Jun 17, 2010 at 3:33 PM, Doran, Harold wrote: > I have a function that is an iterative process for estimating some MLEs. I > want to print some progress to screen as the process iterates. I would like > to try and line things up nicely in the R window, but am not sure the best > way to

Re: [R] R user interface

2010-06-17 Thread RICHARD M. HEIBERGER
RExcel on Windows is designed for this task. See rcom.univie.ac.at for examples including a video. While you can download the RExcelInstaller package from CRAN, we recommend installing R with RExcel and other packages it needs with the RAndFriends installer available on the download page at rcom.u

[R] Problems using allEffects() (package effect)

2010-06-17 Thread Jonas Mandel
Dear R users, I have some trouble using the allEffects() function to compute and display effect plots for a linear model. My data is quite simple, it concerns effects of 3 treatments on the tumoral volume of mice. vTum codes for the qualitative initial volume, from small to big, temps is the time

Re: [R] R licensing query

2010-06-17 Thread Frank E Harrell Jr
Pardon my english but you're working for idiots. I'd look elsewhere if there are other options. IT departments should be here to help get things done, not to help prevent good work from being done. Frank On 06/17/2010 04:28 AM, McAllister, Gina wrote: I have recently started a new job at an

Re: [R] trigonometric regression

2010-06-17 Thread William Dunlap
> -Original Message- > From: r-help-boun...@r-project.org > [mailto:r-help-boun...@r-project.org] On Behalf Of Duncan Murdoch > Sent: Thursday, June 17, 2010 3:19 AM > To: William Simpson > Cc: r-help@r-project.org > Subject: Re: [R] trigonometric regression > > William Simpson wrote: >

Re: [R] Pretty printing progress

2010-06-17 Thread Douglas Bates
On Thu, Jun 17, 2010 at 10:50 AM, Barry Rowlingson wrote: > On Thu, Jun 17, 2010 at 3:33 PM, Doran, Harold wrote: >> I have a function that is an iterative process for estimating some MLEs. I >> want to print some progress to screen as the process iterates. I would like >> to try and line thing

Re: [R] Pretty printing progress

2010-06-17 Thread Barry Rowlingson
On Thu, Jun 17, 2010 at 4:56 PM, Doran, Harold wrote: > Hi Barry: > > I don't think so. In addition to what I put in the example below, there are > some other diagnostics I want to print to screen as the optimization > proceeds. I don't see in the help page whether that is possible in this > fu

[R] nnet

2010-06-17 Thread Changbin Du
HI, Dear R community, I am using the nnet to fit a neural network model to do classification on binary target variable (0, 1). I am using the following codes: nnet.fit<-nnet(as.factor(out) ~ ., data=train, size=5, rang=0.3, decay=5e-4, maxit=500) I want to know what is the activation function f

[R] stplot help

2010-06-17 Thread netrunner
Hi, I need to estimate the size of a Theiler window. I know that it is possible to use the space-time separation plot, but how? thank you g -- View this message in context: http://r.789695.n4.nabble.com/stplot-help-tp2259038p2259038.html Sent from the R help mailing list archive at Nabble.co

Re: [R] Pretty printing progress

2010-06-17 Thread Doran, Harold
I was actually trying to model some of what I'm doing after the verbose = TRUE argument in lmer, but had a hard time finding the chunk of code. I'm still looking for it, but got ahead of myself. -Original Message- From: dmba...@gmail.com [mailto:dmba...@gmail.com] On Behalf Of Douglas Ba

Re: [R] Pretty printing progress

2010-06-17 Thread Doran, Harold
Hi Barry: I don't think so. In addition to what I put in the example below, there are some other diagnostics I want to print to screen as the optimization proceeds. I don't see in the help page whether that is possible in this function. Am I missing something? -Original Message- From:

Re: [R] working with zoo time index ??

2010-06-17 Thread skan
I've read all these documents and some other. -- View this message in context: http://r.789695.n4.nabble.com/working-with-zoo-time-index-tp2255804p2259106.html Sent from the R help mailing list archive at Nabble.com. __ R-help@r-project.org mailing li

Re: [R] R licensing query

2010-06-17 Thread Ed Keith
Unfortunately this is how things work in the real world. I suspect the reason so many people keep getting in trouble for taking classified information home is because they can not get any work done on the office computer due to things like this. Many of the places I've worked have not permuted

Re: [R] Optimization problem

2010-06-17 Thread Ravi Varadhan
Here is a general approach using smoothing using the Gasser-Mueller kernel, which is implemented in the "lokern" package. The optimal bandwidth for derivative estimation is automatically chosen using a plug-in approximation. The code and the results are attached here. Let me know if you have any

[R] tempfile problem

2010-06-17 Thread Ben Madin
G'day all, The documentation for tempfile states : "The names are very likely to be unique among calls to tempfile in an R session and across simultaneous R sessions. The filenames are guaranteed not to be currently in use." My problem I think relates to the second part of the sentence, which

[R] hypoexponential distribution

2010-06-17 Thread Arnau Mir
Hello. Somebody knows if R has implemented the cdf and pdf of the hypoexponential distribution? Thanks, Arnau. __ 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.o

Re: [R] R licensing query

2010-06-17 Thread Barry Rowlingson
On Thu, Jun 17, 2010 at 5:11 PM, Frank E Harrell Jr wrote: > Pardon my english but you're working for idiots.  I'd look elsewhere if > there are other options.  IT departments should be here to help get things > done, not to help prevent good work from being done. Just because the IT security gu

Re: [R] tempfile problem

2010-06-17 Thread jim holtman
take the name returned by tempfile and append the current TOD; this should make it fairly unique and will let you do some cleanup if you are going to keep the files around for some length of time. On Thu, Jun 17, 2010 at 12:43 PM, Ben Madin wrote: > G'day all, > > The documentation for tempfile s

Re: [R] Problems using allEffects() (package effect)

2010-06-17 Thread Joris Meys
Please, read the posting guide: - provide a minimal example - tell us from which package the function is coming I guess you used the function allEffects() from the package effects, and did : eff.lm1 <- allEffect(lm1) Then I guess that there's something wrong with the variables you put into the mo

Re: [R] R user interface

2010-06-17 Thread jverzani
Shubha Vishwanath Karanth ambaresearch.com> writes: > > Hi R, > > I have a an excel file with a lot of data. I need to create an user > interface in R, which has one single screen. It needs to contain a right > pane containing the click buttons for different countries (say). If the > user click

Re: [R] tempfile problem

2010-06-17 Thread Duncan Murdoch
On 17/06/2010 12:43 PM, Ben Madin wrote: G'day all, The documentation for tempfile states : "The names are very likely to be unique among calls to tempfile in an R session and across simultaneous R sessions. The filenames are guaranteed not to be currently in use." My problem I think relates

[R] library(...,pos=) is not consistent

2010-06-17 Thread Russell Ivory
I want to be able to load a library in a specified position using the pos= argument and have any subsequent library required by the one I'm loading go into a specified library as well. For example, in loading caret, it requires and loads lattice as well. When I specify that caret goes into positi

Re: [R] tempfile problem

2010-06-17 Thread Romain Francois
Le 17/06/10 18:59, Duncan Murdoch a écrit : On 17/06/2010 12:43 PM, Ben Madin wrote: G'day all, The documentation for tempfile states : "The names are very likely to be unique among calls to tempfile in an R session and across simultaneous R sessions. The filenames are guaranteed not to be c

Re: [R] library(...,pos=) is not consistent

2010-06-17 Thread Gabor Grothendieck
On Thu, Jun 17, 2010 at 1:11 PM, Russell Ivory wrote: > I want to be able to load a library in a specified position using the > pos= argument and have any subsequent library required by the one I'm > loading go into a specified library as well.  For example, in loading > caret, it requires and loa

[R] program R using mac Xcode

2010-06-17 Thread Waverley @ Palo Alto
Hi, I am starting to use Xcode a lot for C/C++ programming. Can you do R programming in Xcode? If can, how to configure to enable this? Much thank in advance. -- Waverley @ Palo Alto __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman

Re: [R] R licensing query

2010-06-17 Thread Joris Meys
Worst case scenario you can install R as a user as well, you don't need administration rights. Regarding data analysis in Excel : http://www.pages.drexel.edu/~bdm25/excel2007.pdf : peer reviewed Other sources : http://www.coventry.ac.uk/ec/~nhunt/pottel.pdf http://www.forecastingprinciples.com/f

Re: [R] R licensing query

2010-06-17 Thread Marc Schwartz
On Jun 17, 2010, at 11:46 AM, Barry Rowlingson wrote: > On Thu, Jun 17, 2010 at 5:11 PM, Frank E Harrell Jr > wrote: >> Pardon my english but you're working for idiots. I'd look elsewhere if >> there are other options. IT departments should be here to help get things >> done, not to help preven

Re: [R] library(...,pos=) is not consistent

2010-06-17 Thread Gabor Grothendieck
On Thu, Jun 17, 2010 at 1:28 PM, Gabor Grothendieck wrote: > On Thu, Jun 17, 2010 at 1:11 PM, Russell Ivory > wrote: >> I want to be able to load a library in a specified position using the >> pos= argument and have any subsequent library required by the one I'm >> loading go into a specified lib

Re: [R] trigonometric regression

2010-06-17 Thread William Simpson
Thanks, Bill! Bill On Thu, Jun 17, 2010 at 5:12 PM, William Dunlap wrote: > > You can also define a function that keeps the cos > and sin terms together so anova(fit) shows > one entry for the (cos,sin) pair.  E.g., define > the following function >  cs <- function(x, freq)cbind(cos=cos(x*freq)

[R] Optimization problem

2010-06-17 Thread William Simpson
Sorry, thought you wanted to find lowest value of x that produced maximum value of y. I see now that is not the case. I think you have to decide on what amount of improvement per device you judge to be 'minimal'. Then the algorithm uses the value of y that occurs at the point where this criterion

Re: [R] Plotting confidence intervals of two response on same graph (panel).

2010-06-17 Thread Kim Jung Hwa
I actually need to plot all of my confidence interval for x and y axis but it seems error.crosses only plot the common ones. But thanks for suggesting error.crosses. Please let me know if I can specify some option in eror.crosses to implement that. Any idea about how to plot all confidence interva

Re: [R] Question regarding print

2010-06-17 Thread Greg Snow
The cat function is probably the best approach, but if your really feel the need to use print then you can just assign blank names (now it will be a named vector and slower in heavy calculations, but the printing is different). Try something like: > names(x) <- rep( '', length(x) ) > print(x)

  1   2   >