Re: [R] Help required with png graphic production as text has shadows?

2010-04-12 Thread Karl Ove Hufthammer
Alice Johnstone wrote: > I have produced a series of graphs with the png command, however when I > have finally printed these out the black text appears to have a colour > shadow with blue or red on either side of the letter. What you’re seeing is likely subpixel antialiasing. How to ‘fix’ this

[R] gnls for negative autocorrelation?

2010-04-12 Thread Seth
Hi, I have data with negative spatial autocorrelation at short lags. It is well described by a spherical model, but flipped upside from what is normally seen. It seems that gnls will work with this correlated residual type IF one parameter in the spherical model can be negative (it is usually p

Re: [R] Binning Question

2010-04-12 Thread Noah Silverman
David, That helps me a lot. Thanks!!! -N On 4/12/10 9:06 PM, David Winsemius wrote: dat <- as.data.frame(matrix( rnorm(200), 100 , 2)) # bivariate normal n=100 ab <- matrix( c(-5,-5,5,5), 2, 2) # interval [-5,5) x [-5,5) nbin <- c( 20, 20) # 400 bins bins <- bin2(dat, ab, nbin) # bin coun

[R] Help required with png graphic production as text has shadows?

2010-04-12 Thread Alice Johnstone
I have produced a series of graphs with the png command, however when I have finally printed these out the black text appears to have a colour shadow with blue or red on either side of the letter. I tried increasing my res to 1200 and this improved it somewhat, but the text is still not sharp an

Re: [R] Binning Question

2010-04-12 Thread David Winsemius
On Apr 12, 2010, at 9:07 PM, Noah Silverman wrote: Hi, I'm trying to setup some complicated binning with statistics and could use a little help. I've found the bin2 function from the ash package, but it doesn't do everything I need. My intention is to copy some of their code and then modi

Re: [R] checking frequency in xts and zoo objects

2010-04-12 Thread Gabor Grothendieck
1 is the correct answer. The difference between successive time values, deltat, is 1 or a multiple of 1 and frequency is the reciprocal of deltat. On Mon, Apr 12, 2010 at 11:46 PM, Erin Hodgess wrote: > Thank you! > > Here is something that I just ran into.  I have a business day series, > spc,

Re: [R] checking frequency in xts and zoo objects

2010-04-12 Thread Erin Hodgess
Thank you! Here is something that I just ran into. I have a business day series, spc, which I obtained using get.hist.quote. When I tried frequency(spc), I got 1. > str(spc) ‘zoo’ series from 1998-01-02 to 2010-04-09 Data: num [1:3086, 1] 975 977 967 964 956 ... - attr(*, "dimnames")=List o

Re: [R] checking frequency in xts and zoo objects

2010-04-12 Thread Gabor Grothendieck
Note that the preferred way of doing this with ts series is to use the frequency() function rather than using tsp. That function also works for zoo objects. On Mon, Apr 12, 2010 at 11:20 PM, Erin Hodgess wrote: > Dear R People: > > When I have a time series, I can get the frequency of the serie

[R] checking frequency in xts and zoo objects

2010-04-12 Thread Erin Hodgess
Dear R People: When I have a time series, I can get the frequency of the series via tsp(x)[3]. Is there a similar function for xts and zoo objects, please? Thanks, Erin -- Erin Hodgess Associate Professor Department of Computer and Mathematical Sciences University of Houston - Downtown mailto

[R] Error using reshape method

2010-04-12 Thread shmy
To be fair I don't really understand what the error is telling me so I don't know how to correct it. I'm trying to reshape my data so that I do repeated measures ANOVA on it. The warning message: "Error in d[, timevar] <- times[1L] : subscript out of bounds" The program: library(QRMlib) lib

[R] source(,echo=T) doesn't echo final comments

2010-04-12 Thread Kuhn, Alexandre (NIH/NIA/IRP) [V]
Hi, source(file,echo=T) will not echo the last comment in "file" if it is the last line in the file. For instance, when sourcing a file containing the following lines #comment 1 a<-1 #comment 2 R will echo > #comment 1 > a<-1 What is the solution to have R echo all of the comment lines? Spec

[R] zerinfl() vs. Stata's zinb

2010-04-12 Thread David Fortunato
Hello, I am working with zero inflated models for a current project and I am getting wildly different results from R's zeroinfl(y ~ x, dist="negbin") command and Stata's zinb command. Does anyone know why this may be? I find it odd considering that zeroinfl(y ~ x, dist="poisson") gives identical t

[R] Binning Question

2010-04-12 Thread Noah Silverman
Hi, I'm trying to setup some complicated binning with statistics and could use a little help. I've found the bin2 function from the ash package, but it doesn't do everything I need. My intention is to copy some of their code and then modify as needed. I have a vector of two columns: head(data)

Re: [R] efficiently picking one row from a data frame per unique key

2010-04-12 Thread Peter Alspach
Tena koe James You might try duplicated(), or more to the point !duplicated() orderedData[!duplicated(orderedData$x),] HTH Peter Alspach > -Original Message- > From: r-help-boun...@r-project.org [mailto:r-help-boun...@r- > project.org] On Behalf Of James Kebinger > Sent: Tuesday,

Re: [R] efficiently picking one row from a data frame per unique key

2010-04-12 Thread Phil Spector
James - If I understand you correctly: getone = function(df)df[order(df$x,df$y),][1,] describes what you want from each data frame corresponding to a unique value of x. Then, supposing that your data frame is called df: sdf = split(df,df$x) will create a list of data frames for the uniqu

Re: [R] SSH Through R Script

2010-04-12 Thread Sharpie
Sorry about the double post, but this line: Sharpie wrote: > > ssh u...@webserver.com -e "cd ~/.ssh;cat webKey.pub >> authorized_keys" > Should be: ssh u...@webserver.com "cd ~/.ssh;cat webKey.pub >> authorized_keys" I.e., omit the -e flag. Apologies, -Charlie - Charlie Sharpstee

Re: [R] SSH Through R Script

2010-04-12 Thread Sharpie
afoo wrote: > > Hi, > > I am trying to SSH to a remote server through R script. In other words, I > would like to know how I can get a SSH connection to the remote server and > then execute commands on that server with the R script. > > So in bash, I would normally type ssh -lusername remotese

[R] efficiently picking one row from a data frame per unique key

2010-04-12 Thread James Kebinger
Hello all, I'm trying to transform data frames by grouping the rows by the values in a particular column, ordered by another column, then picking the first row in each group. I'd like to convert a data frame like this: x y z 1 10 20 1 11 19 2 12 18 4 13 17 into one with three rows, like this,

[R] R Internal Web Server Loopback Interface Limit

2010-04-12 Thread D. Dashcle
Is there a setting or easy way I can remove the code that makes R only listen for web traffic on 127.0.0.1? I've noticed it seems to reject traffic to both the regular help files (i.e. what starts up when I do "?function"), as well as if I try to connect to pages I've made for the R.rsp package

Re: [R] Excel date to R format

2010-04-12 Thread Gabor Grothendieck
Try this: > sprintf("%.3f", as.numeric(as.POSIXct(39965.004,origin=as.Date("1970-1-1" [1] "39965.004" > getOption("digits.secs") NULL > as.POSIXct(39965.004,origin=as.Date("1970-1-1")) [1] "1970-01-01 06:06:05 EST" > sprintf("%.3f", as.numeric(as.POSIXct(39965.004,origin=as.Date("1970-1-1")))

Re: [R] Excel date to R format

2010-04-12 Thread Ben Bolker
Gabor Grothendieck gmail.com> writes: > > See the relevant article in R News 4/1. > > On Mon, Apr 12, 2010 at 10:36 AM, ManInMoon wrote: > > > > I have a vector of double like this from Excel. > > > > 39965.0004549653 > > > > and I want to put them in R such that I can display them in any Date

Re: [R] Figures within tables [slightly off-topic]

2010-04-12 Thread baptiste auguie
Hi, On 12 April 2010 22:07, Peter Jepsen wrote: > > 3. Are there R packages that can "draw tables"? the gplots package has a textplot() function, and the gridExtra package a tableGrob(), http://rwiki.sciviews.org/doku.php?id=tips:graphics-grid:table In theory it should be possible to adapt the

Re: [R] Excel date to R format

2010-04-12 Thread Gabor Grothendieck
See the relevant article in R News 4/1. On Mon, Apr 12, 2010 at 10:36 AM, ManInMoon wrote: > > I have searched and tried to read before posting but can find nothing to > accomplish change Excel dates in double format to R > > Can someone please help > > I have a vector of double like this from Ex

[R] Tck/tk help

2010-04-12 Thread Rick M
I am trying to create a simple window that displays a dataframe. I was able to put together a function from a couple of examples on the web. For the most part my function works. The only problem is with resizing the window. I found a post where someone suggested using with(env,tkpack("configur

Re: [R] R GUI

2010-04-12 Thread Tengfei Yin
Hi I like gWidgets, you can choose different api, like rgtk2, tcltkeasy to use in R, looks pretty(at least for me), try the examples in the website first, the link below is the answers with tutorial links, you can also check gWidgets vignette. https://stat.ethz.ch/pipermail/r-sig-gui/2008-Aug

Re: [R] Figures within tables [slightly off-topic]

2010-04-12 Thread Erik Iverson
Hello, I am writing a manuscript for a scientific journal in clinical medicine. I have three groups of patients, and I present a 10*3 table of their characteristics in Table 1. Some of their characteristics, e.g. their age, are on a continuous scale, others are dichotomous. I am thinking of pres

Re: [R] R GUI

2010-04-12 Thread Vojtěch Zeisek
Dne Po 12. dubna 2010 22:00:21 Amitoj S. Chopra napsal(a): > I am really new with R Graphical user interfacefunctions. I am developing a > software package to calculate pKa (biochemistry) but I want to make it look > aesthetically pleasing and make it user friendly. I have heard that R has > some G

Re: [R] R GUI

2010-04-12 Thread Khanh Nguyen
I have toyed with 'traitr' recently... It is not fancy, but relatively easy to figure out. -k On Mon, Apr 12, 2010 at 4:00 PM, Amitoj S. Chopra wrote: > > I am really new with R Graphical user interfacefunctions. I am developing a > software package to calculate pKa (biochemistry) but I want to

[R] Figures within tables [slightly off-topic]

2010-04-12 Thread Peter Jepsen
Dear R-listers I am writing a manuscript for a scientific journal in clinical medicine. I have three groups of patients, and I present a 10*3 table of their characteristics in Table 1. Some of their characteristics, e.g. their age, are on a continuous scale, others are dichotomous. I am thinkin

[R] R GUI

2010-04-12 Thread Amitoj S. Chopra
I am really new with R Graphical user interfacefunctions. I am developing a software package to calculate pKa (biochemistry) but I want to make it look aesthetically pleasing and make it user friendly. I have heard that R has some GUI (Graphical user interface) and you can do some really cool stuf

Re: [R] How to run Shapiro-Wilk test for each grouped variable?

2010-04-12 Thread Iurie Malai
Noel, thanks a lot. This will help me someday. But I have a question. When we run Shapiro-Wilk test, the homogenity of variances is a mandatory condition? 2010/4/12 Yvonnick Noel : > Dear Iurie, > >> I want to run Shapiro-Wilk test for each variable in my dataset, each >> grouped by variable grou

Re: [R] lattice garphs: combining multiple scatterplots and addinglegend

2010-04-12 Thread Peter Ehlers
Actually, Bert, auto.key can be used. See below. On 2010-04-12 11:41, Bert Gunter wrote: There us no "groups" argument in your xyplot call, so how is auto.key supposed to define a legend? (and note that auto.key should be a logical not a list). Please re-read the auto.key section in the xyplot

[R] [R-pkgs] New package mvngGrAd

2010-04-12 Thread F Te
Dear useRs, I am glad to announce that that my package mvngGrAd (read: "moving grid") is now available on CRAN. The package implements moving grid adjustment, which is a spatial method used in (unreplicated) plant breeding trials to adjust phenotypic values for environmental effects. The adj

Re: [R] Excel date to R format

2010-04-12 Thread ManInMoon
I mean I want to convert them to whatever is the standard R DateTime class. -- View this message in context: http://n4.nabble.com/Excel-date-to-R-format-tp1837208p1837280.html Sent from the R help mailing list archive at Nabble.com. __ R-help@r-projec

Re: [R] simple question about contrasts, lm and factors

2010-04-12 Thread friendpine
If one of your variable is discrete,such as 1/0, the logistic regression is better.Try the glm() function. -- View this message in context: http://n4.nabble.com/simple-question-about-contrasts-lm-and-factors-tp1835964p1837091.html Sent from the R help mailing list archive at Nabble.com. ___

[R] Excel date to R format

2010-04-12 Thread ManInMoon
I have searched and tried to read before posting but can find nothing to accomplish change Excel dates in double format to R Can someone please help I have a vector of double like this from Excel. 39965.0004549653 and I want to put them in R such that I can display them in any Date and Time fo

[R] glmer with non integer weights

2010-04-12 Thread Kay Cichini
hello, i'd appreciate help with my glmer. i have a dependent which is an index (MH.index) ranging from 0-1. this index can also be considered as a propability. as i have a fixed factor (stage) and a nested random factor (site) i tried to model with glmer. i read that it's possible to use a quasib

[R] Antw: RE: Local R Training

2010-04-12 Thread Dominik Riva
Dear Charles, this sounds perfect. I knew I would find the information on this list. Thanks to all that answered my question. Regards, Dominik Riva Universitätsspital Basel Med. Querschnittsfunktionen Pathologie Schoenbeinstrasse 40 CH-4031 Basel Telefon 061 556 53 67 Cordless65367

[R] read.socket and timeout

2010-04-12 Thread Sean Davis
I have an external process that is listening to and responding on a port. This is working fine. If the external service is not running, though, read.socket does not return and I do not see a way to interrupt it. Is there a general way to deal with this situation to have a timeout or of testing a

[R] Data Synchronization -- detecting time differences in multi-source data

2010-04-12 Thread Ralf B
Hi R enthusiasts, I am dealing with logging data from different sources that contain data from user activities. The data is all timelined with one column containing Epoch time and two columns containing data (x and y coordinates of mouse movements) = three columns for each source. I have up to 10

[R] rgdal package: save multiband image in tiff file

2010-04-12 Thread Niceman_64
Hello all, I am trying to save a multiband matrix in a tiff file with writeGDAL() from the rgdal package. The code below only saves the first band of the matrix StockMat. Do you have any suggestion to correct my code? Thanks a lot. nbRow=nrow(StockMat) nbCol=ncol(StockMat) StockMat_GridTopo=Gri

Re: [R] lattice garphs: combining multiple scatterplots and addinglegend

2010-04-12 Thread Bert Gunter
There us no "groups" argument in your xyplot call, so how is auto.key supposed to define a legend? (and note that auto.key should be a logical not a list). Please re-read the auto.key section in the xyplot man page. Bert Gunter Genentech Nonclinical Biostatistics -Original Message- Fro

[R] lattice garphs: combining multiple scatterplots and adding legend

2010-04-12 Thread Jannis
Dear List members, its me again, fighting with lattice graphics. I am trying to plot a world map, add some points on different locations with different colors and add a legend, but did not succeed yet with the legend. Here is my code: library(fields) # Data for demonstration data_x = c(0,50

Re: [R] Sweave and multiple figures from an R source file

2010-04-12 Thread Duncan Murdoch
On 12/04/2010 12:08 PM, michele donato wrote: Hi, I am trying to get figures from multiple source files in Sweave. My test file is as follows \documentclass{article} \usepackage{Sweave} \begin{document} \begin{section}{notitle} This is a simple Sweave test <>= source("./testfig.r") @ \\ End of

Re: [R] library sets: A & EMPTY does not work; gset_intersection(A,EMPTY) works

2010-04-12 Thread Czerminski, Ryszard
Hi David, Thanks! I just tried it with new sets version (1.0-6) and it works great! Thanks again for a very nice package. Best regards, Ryszard -- Confidentiality Notice: This message is private and may contain confidential

Re: [R] Strange results from Multivariate Normal Density

2010-04-12 Thread Ravi Varadhan
It does make sense because your variance-covariance matrix is NOT positive-definite. So, it cannot be a variance-covariance matrix. Ravi. -Original Message- From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] On Behalf Of Downey, Patrick Sent: Monday, April 12, 201

Re: [R] Rsge: recursive parallelization

2010-04-12 Thread Peter Danenberg
Quoth Martin Morgan on Boomtime, the 29th of Discord: > It seems like it would be hard to think about the tasks that are > being executed, how many processes there are, how load balancing > works, etc. A flat representation of our nested data is, alas, too large to contain in memory; and dynamical

[R] Sweave and multiple figures from an R source file

2010-04-12 Thread michele donato
Hi, I am trying to get figures from multiple source files in Sweave. My test file is as follows \documentclass{article} \usepackage{Sweave} \begin{document} \begin{section}{notitle} This is a simple Sweave test <>= source("./testfig.r") @ \\ End of the simple sweave test \end{section} \end{docum

[R] How to derive function for parameters in Self start model in nls

2010-04-12 Thread Asif Wazir
Dear all i want to fit the self start model in nls. i have two question. i have a function, (asfr ~ I(((a*b)/c))+ ((c/age)^3/2)+ exp((-b^2)*(c/age)+(age/c)-2) i am wondering how to build the selfstart model. there is lost of example, (i.e. SSgompertz, SSmicman, SSweibull, etc). my question is, how

[R] Strange results from Multivariate Normal Density

2010-04-12 Thread Downey, Patrick
Hello, I'm using dmnorm from the package {mnormt} and getting strange results. First, according to the documentation, dmnorm should return a vector of densities, and I'm only getting one value returned (which is what I would expect). I've been interpreting this as the joint density of all values

Re: [R] Expectation of E(x^1/2)

2010-04-12 Thread JLucke
Ben, Ravi, Chuck, and Haneef, Note that the standard normal density can be written (in pseudo-TeX) as 1/sqrt(2*pi) * exp[- ( x/sqrt(2) )^2]. The exponential on the right is a special case of the stretched exponential function exp[- (x/sqrt(tau))^beta]. The stretched exponential function has

[R] multilevel (3-level) Hausman-Taylor estimator

2010-04-12 Thread Gerry Cress
Dear R users, I have a question on multilevel modeling with R when there is endogenous regressor(s) involved. As far as my economics background concerned, I understand that Hausman-Taylor estimator (via Generalized Least Square) deals with this situation and the package plm does the trick. Unfortu

Re: [R] rpart: Writing values of the leaves to a dateset

2010-04-12 Thread Terry Therneau
-- begin inclusion -- I'm fitting a regression tree with rpart and I want to write the values for every leaf in a dataset. As an example take the variable turnover. Let's suppose my tree for turnover has 30 leaves and I want to have 30 datasets with dataset 1 containing the turnover values of

Re: [R] Local R Training

2010-04-12 Thread Charles Roosen
Dear Dominik, Mango Solutions is a long-established R training and consulting company based in the UK. In February we started Mango Solutions AG based right here in Basel, Switzerland. We have an "Introduction to R" course in Basel on May 17th to 18th. Here's a list of the other courses plan

Re: [R] using double loops and saving the data

2010-04-12 Thread Petr PIKAL
Hi r-help-boun...@r-project.org napsal dne 12.04.2010 12:51:24: > > > Petr Pikal wrote: > > > > > > > > Nobody except you has your data available, so without providing more clues > > you can not expect mor relevant answers. > > > > Try str(your.objects) and maybe you could use debug to

[R] rGraphviz: Changing edge label font size

2010-04-12 Thread nick harding
Dear all, Using rGraphviz, I would like to make my edge labels a smaller size than the node labels, but I am unable to change the font size of edge labels independently of node labels. The edge labels always seem to use the font size defined for nodes. I have searched the archives and found a s

Re: [R] N'th of month working day problem

2010-04-12 Thread Gabor Grothendieck
I assume what you want is not the last data value in each month labelled with the nth day of the month (or the last day of the month if there are fewer than n days) but the last day in the data that is on or prior to the nth of the month. If that is what you want then try this. nth.of.month <- fu

[R] Local R Training

2010-04-12 Thread Dominik Riva
Hello List, I am new to R and statistics in general. My two colleges and I would like to get some training in the proper usage of R. A quick internet search provided no results for the region of Basel in Switzerland. Does some one on this list knows of any trainers or schools in the region in

[R] Matrix is not symmetric under lme4

2010-04-12 Thread Wkoef Slknfd
Dear all, After I run package lme4" and function "glmer", I got the error message as the following.  Matrix is not symmetric under lme4   Is it possiable to avoid this error when my data is huge? Or use the other package? Thank you. [[alternative HTML version deleted]]

Re: [R] MCMC results into LaTeX

2010-04-12 Thread Shige Song
Dear Dieter, That sounds like a good solution, thanks. Shige On Mon, Apr 12, 2010 at 2:27 AM, Dieter Menne wrote: > > > Shige Song wrote: >> >> >> What is the preferred way to get Bayesian analysis results (such as >> those from MCMCpacki, MCMCglmm, and DPpackage) into LaTeX table >> automatica

Re: [R] SAS like Macro variable substituion?

2010-04-12 Thread Peter Ehlers
?get On 2010-04-12 5:06, David Young wrote: I'd like to use a string to refer to an R object with the end objective of going through a loop and saving various files of the same name with different contents using a numbered suffix. # This will be the loop counter and file suffix. master.i<- 1 #

Re: [R] SAS like Macro variable substituion?

2010-04-12 Thread Benilton Carvalho
save(list=paste("unislopes", master.i, sep=""), file=paste("unislopes",master.i,".Rdata",sep="")) On Mon, Apr 12, 2010 at 12:06 PM, David Young wrote: > I'd like to use a string to refer to an R object with the end > objective of going through a loop and saving various files of the same > name wi

Re: [R] Peculiar behaviour with MatchIt and a function

2010-04-12 Thread Peter Ehlers
On 2010-04-11 14:27, Ajay Shah wrote: Folks, I have a strange situation where: library(MatchIt) f<- function(d) { m<- matchit(treatment ~ lsales + major.industry, data=d, method="nearest", discard="hull.treat") treatmentfirms<- match.data(m, group="treat")

[R] SAS like Macro variable substituion?

2010-04-12 Thread David Young
I'd like to use a string to refer to an R object with the end objective of going through a loop and saving various files of the same name with different contents using a numbered suffix. # This will be the loop counter and file suffix. master.i <- 1 # This is the generic file name. unislopes <- c

Re: [R] using double loops and saving the data

2010-04-12 Thread ChinChin
Petr Pikal wrote: > > > You did not tell much more about your data and procedures. Each object > type has some distinct way of indexing and you can not mix them up. > > x<-1:10 >> x[5] > [1] 5 >> x[[5]] > [1] 5 >> x[5,] > Error in x[5, ] : incorrect number of dimensions > >> x<-list(1:10) >

Re: [R] Interpreting factor*numeric interaction coefficients

2010-04-12 Thread Peter Ehlers
On 2010-04-12 3:15, Matthew Carroll wrote: Dear all, I am a relative novice with R, so please forgive any terrible errors... I am working with a GLM that describes a response variable as a function of a categorical variable with three levels and a continuous variable. These two predictor variabl

Re: [R] Interpreting factor*numeric interaction coefficients

2010-04-12 Thread ONKELINX, Thierry
Dear Matthew, The easiest way the get the estimates (and their standard error) for the different slopes it to reparametrise your model. Use resp ~ var1 : cat + 0 instead of resp ~ var1 * cat HTH, Thierry ir. Thierry O

[R] rpart: Writing values of the leaves to a dateset

2010-04-12 Thread hhafner
I'm fitting a regression tree with rpart and I want to write the values for every leaf in a dataset. As an example take the variable turnover. Let's suppose my tree for turnover has 30 leaves and I want to have 30 datasets with dataset 1 containing the turnover values of the units in leaf 1, da

[R] Problem writing netcdf data with Rclim

2010-04-12 Thread zow...@ncst.go.ke
Dear Users: I am able to read the file precip.nc (CMAP monthly precip) using the Rclim package. How ever, when I try to write the data in a netcdf file, I get the following error about the missing value attribute: > pcpmon<-netcdfread("precip.nc","lon","lat","time","precip",unpack=T) > netcdfw

[R] Interpreting factor*numeric interaction coefficients

2010-04-12 Thread Matthew Carroll
Dear all, I am a relative novice with R, so please forgive any terrible errors... I am working with a GLM that describes a response variable as a function of a categorical variable with three levels and a continuous variable. These two predictor variables are believed to interact. An example of su

[R] problems on JGR package and demo() function in Ubuntu linux

2010-04-12 Thread Mao Jianfeng
Dear R-helpers I want to express my respect and thankfulness to all of you. I have ever ask this question about one hour ago. Following Mr. Henrik Bengtsson's advice I re-submit this query here. I just switch from windows xp to Ubuntu linux platform. I am facingtwo problems when I run R in Ubuntu

[R] graphical data representation after glmm, glmer

2010-04-12 Thread Kay Cichini
hello, i ran a glmer for binomial data, with one (ordered) between and one within subjects factor. now i was thinking of how to plot my dependent. i plotted the probablities (p=X(incidents)/n(observations)) for each group of the between factor in a line chart, with its corresponding standard dev

Re: [R] make.groups function of laatice is not working?

2010-04-12 Thread David Winsemius
On Apr 12, 2010, at 2:20 AM, newbie_2010 wrote: require(lattice) Loading required package: lattice Error in library(package, lib.loc = lib.loc, character.only = TRUE, logical.return = TRUE, : 'lattice' is not a valid installed package library(lattice) Error in library(lattice) : 'lattice

Re: [R] using double loops and saving the data

2010-04-12 Thread Petr PIKAL
Hi r-help-boun...@r-project.org napsal dne 12.04.2010 07:14:14: > > > David Winsemius wrote: > > > > > > > >>I am guessing that the first time through when i= 5200 that i+1 is > >>indexing an entry that does not exist. What does str( Price[[1]] > >>[5200+1] ) return? What about str(Ca)? >

Re: [R] How to run Shapiro-Wilk test for each grouped variable?

2010-04-12 Thread Yvonnick Noel
Dear Iurie, I want to run Shapiro-Wilk test for each variable in my dataset, each grouped by variable groupFactor. Note that, at least on a single dependent variable with a grouping variable, a possible simplification may arise when homogeneity of variances is assumed and reasonable. You may

Re: [R] make.groups function of laatice is not working?

2010-04-12 Thread newbie_2010
> require(lattice) Loading required package: lattice Error in library(package, lib.loc = lib.loc, character.only = TRUE, logical.return = TRUE, : 'lattice' is not a valid installed package > library(lattice) Error in library(lattice) : 'lattice' is not a valid installed package > I got th

Re: [R] two problems on R in Ubuntu linux

2010-04-12 Thread Henrik Bengtsson
Always provide sessionInfo() and traceback() when reporting errors. /Henrik On Mon, Apr 12, 2010 at 8:34 AM, Mao Jianfeng wrote: > Dear R-helpers > > I want to express my respect and thankfulness to all of you. > > I just switch from windows xp to Ubuntu linux platform. I am facing > two problems

Re: [R] how to calculate a table

2010-04-12 Thread Dieter Menne
Bernd Dittmann wrote: > > (Sample boot code see below) > ... > So far so good. But how can I bring it into table-form whereby the > combination of all 10 different weights (setting steps as 1) and their > respective bootstrapped means are printed: > > weights mean.boot > 1

Re: [R] make.groups function of laatice is not working?

2010-04-12 Thread David Winsemius
On Apr 12, 2010, at 1:35 AM, newbie_2010 wrote: I almost wasted 3 hours to make lattice functions work. :(. Phew! I installed package lattice, lattice extra and other supportive packages to use functions I thought lattice was now part of the default installation? It's not lattice extra