[R] missRanger package

2018-11-12 Thread Rebecca Bingert
Hi, does anybody know where I need to insert the censoring in the missRanger package? Regards, Rebecca __ R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting guide

[R] randomForrest-imputation

2018-11-09 Thread Rebecca Bingert
Hi! How can I generate only positive data with randomForrest-imputation? I'm working with laboratory values which are always positive. Can anybody help out? Thanks! (P.S.: I needed to send this request again because there were problems by delivering it) __

[R] Efficiently parallelize across columns of a data.table

2016-08-20 Thread Rebecca Payne
Makes sense. Thanks for the clear explanation. Rebecca On Friday, August 19, 2016, Peter Langfelder > wrote: > Last time I looked (admittedly a few years back), on unix-alikes > (which you seem to be using, based on your use of top), > foreach/doParallel used forking. This means

[R] Efficiently parallelize across columns of a data.table

2016-08-19 Thread Rebecca Payne
I am trying to parallelize a task across columns of a data.table using foreach and doParallel. My data is large relative to my system memory (about 40%) so I'm avoiding making any copies of the full table. The function I am parallelizing is pretty simple, taking as input a fixed set of columns and

[R] R count.points thinks projections are different

2016-03-18 Thread Rebecca Wooldridge [bs13rw]
I am currently working with telemetry data for some cats: x<-read.csv("CCATS.csv") obs2<-x[c("ID", "X", "Y")] dat_df <- obs2 %>% dplyr::select(ID) %>% as.data.frame() p4s <- "+proj=utm +zone=16 +ellps=clrk66 +datum=NAD27 +units=m +no_defs" p4s_crs <- CRS(p4s) xy <- obs2 %>% dplyr::select(X, Y) %

[R] Nonlinear integer programming (again)

2015-02-14 Thread Zwick, Rebecca J
straint that all values of x are 0 or 1. I can't find a nonlinear optimization program in R that states that it can accommodate 0-1 constraints. Oddly, Excel's Solver will produce a solution to such problems but (1) I don't trust it and (2) it cannot handle a large number

[R] Nonlinear integer programming question

2015-02-11 Thread Zwick, Rebecca J
mization program in R that states that it can accommodate 0-1 constraints. Oddly, Excel's Solver will produce a solution to such problems but (1) I don't trust it and (2) it cannot handle a large number of constraints. Thanks, all! Rebecca Zwick (Santa Barbara, California) Statisti

Re: [R] Error: OutOfMemoryError (Java): GC overhead limit exceeded

2015-02-02 Thread Yuan, Rebecca
Hello Jim, I already use “.xls” for the loading, but still have the memory issue…. Thanks, Rebecca From: jim holtman [mailto:jholt...@gmail.com] Sent: Monday, February 02, 2015 10:21 AM To: Jeff Newmiller Cc: Yuan, Rebecca; R help (r-help@r-project.org) Subject: Re: [R] Error

[R] Error: OutOfMemoryError (Java): GC overhead limit exceeded

2015-02-02 Thread Yuan, Rebecca
a): GC overhead limit exceeded" However, this seems not working any more, is there any other way to help avoiding the memory error issue in R? Thanks very much! Cheers, Rebecca 20 -- This message, and any attachments, i

[R] Error : '.path.package' is defunct.

2014-09-25 Thread Yuan, Rebecca
;) Attaching package: 'zoo' The following objects are masked from 'package:base': as.Date, as.Date.numeric Could you please help on this? Thanks! Rebecca -- This me

[R] How to get the adjusted R squared from GLS() estimator

2014-03-13 Thread Yuan, Rebecca
Hello, Although lm() gives a way to get the adjusted R squared by adjr2 <- summary(mdl)$adj.r.squared I cannot find a way to extract the adjusted R squared from gls(), any hint? Thanks, Rebecca -- This message, and

Re: [R] How to get a substring from a string

2014-01-15 Thread Yuan, Rebecca
Hello A.K., This gives more flexibility to substract the string, thanks very much! Cheers, Rebecca -Original Message- From: arun [mailto:smartpink...@yahoo.com] Sent: Wednesday, January 15, 2014 10:43 AM To: R help Cc: Yuan, Rebecca Subject: Re: [R] How to get a substring from a

Re: [R] Format Sys.time()

2014-01-15 Thread Yuan, Rebecca
Hello Petr, Thanks very much! This works! Cheers, Rebecca -Original Message- From: PIKAL Petr [mailto:petr.pi...@precheza.cz] Sent: Wednesday, January 15, 2014 10:01 AM To: Yuan, Rebecca; R help Subject: RE: Format Sys.time() Hi format(Sys.time(), "%Y_%m_%d_%I_%M%p&qu

[R] Format Sys.time()

2014-01-15 Thread Yuan, Rebecca
Hello all, I know that the following code will give me the format of the Sys.time() till hour (%I), how can I get that till min? what shall I add between %I and %p? format(Sys.time(), "%Y_%m_%d_%I_%p") Thanks very much! Cheers

Re: [R] How to get a substring from a string

2014-01-15 Thread Yuan, Rebecca
This works! Thanks very much! From: Mohammad Tanvir Ahamed [mailto:mashra...@yahoo.com] Sent: Wednesday, January 15, 2014 9:48 AM To: Yuan, Rebecca; R help Subject: Re: [R] How to get a substring from a string Hi ! Try it st<-'yab~a+b+c' strsplit(st,"~")

[R] How to get a substring from a string

2014-01-15 Thread Yuan, Rebecca
I get it out from the whole string? Thanks, Rebecca -- This message, and any attachments, is for the intended r...{{dropped:5}} __ R-help@r-project.org mailing list https://stat.ethz.c

[R] How to altering the colour of confidence intervals in a lattice.

2013-10-11 Thread Rebecca Stirnemann
Hi R wizards, Can any one tell me how to code to remove the title panels in a lattice graph and to make my confidence intervals black instead of coloured? I have the following code: > library(effects) > library(lme4) > data(mao1, package="lme4") > fm1 <- lmer(frat ~ flandusenumb + ground.cover_lo

Re: [R] Help required graphing factors with predicted model settings

2013-10-09 Thread Rebecca Stirnemann
But with three lines for the three habitat types and grass length at the bottom On Thu, Oct 10, 2013 at 5:52 PM, Rebecca Stirnemann wrote: > Thanks Jim for helping, > > Your sample data actually looks like my dataset. The one I put up looks > strange for some reason so please igno

Re: [R] Help required graphing factors with predicted model settings

2013-10-09 Thread Rebecca Stirnemann
;predict") : no applicable method for 'predict' applied to an object of class "mer" Can you see what I am doing wrong? What I am aiming for is a graph which looks like this. Thanks Rebecca On Thu, Oct 10, 2013 at 5:33 PM, Jim Lemon wrote: > On 10/10/2013 08:35 AM,

[R] Help required graphing factors with predicted model settings

2013-10-09 Thread Rebecca Stirnemann
Dear R wizards, Though I hate to do it after weeks of my code not working I need some help since I cant find an example which seems to work. I am trying to create a graph which show the probability of predation of a nest on one side (either 1 to 0) or (0% to 100%) on one side and grass height at t

[R] sample size determination - comparing means for different size samples

2013-06-06 Thread Rebecca Greenblatt
Hmisc R package, specifically bsamsize to compare population proportions, but was wondering if there was an equivalent function for comparing means. -- Rebecca Greenblatt [[alternative HTML version deleted]] __ R-help@r-project.org mailing

[R] The weak exogeneity test in R for the Error Correction Model?

2013-05-28 Thread Yuan, Rebecca
google.com/books?id=ca5MkRbF3fYC Thanks very much! Cheers, Rebecca -- This message, and any attachments, is for the intended r...{{dropped:5}} __ R-help@r-project.org mailing

Re: [R] Assessing the fit of a nonlinear model to a new dataset

2013-04-12 Thread Rebecca Lester
on of plausible models, and comparing my sum of squared residuals to those arising from that distribution. This seems to work. Thanks again. Cheers, Rebecca - Rebecca Lester Lecturer, Freshwater Ecology School of Life & Environmental Sciences Deakin University PO Box 423, Warrnambool, 3280

[R] Can I open an existing pdf file and attach result to it?

2013-04-08 Thread Yuan, Rebecca
Hello all, I would like to attach some results from R to an existing pdf file, can I do that through R? Thanks, Rebecca -- This message, and any attachments, is for the intended r...{{dropped:5

[R] Assessing the fit of a nonlinear model to a new dataset

2013-04-04 Thread Rebecca Lester
-statistic and p-values for each of the iterations using the trace function, but have not yet worked out how to do this. Any other suggestions are also welcome. Many thanks, Rebecca > model.wa <- nls(y ~ A*(x^B), start=list(A=107614,B=-0.415)) # create nls() > power model for WA data

[R] predict.Arima error "'xreg' and 'newxreg' have different numbers of columns"

2013-03-22 Thread Yuan, Rebecca
dep as the newxreg, but got error message(**): (**) Error in as.matrix(newxreg) %*% coefs : requires numeric/complex matrix/vector arguments In addition: Warning message: In chn.forecast[j] <- predict(fit, newxreg = t(indep), n.ahead = 1) : number of items t

Re: [R] error while extracting the p-value from adf.test

2013-03-22 Thread Yuan, Rebecca
Hello José, This is a much convenient way of looking at the components! Thanks very much! Cheers, Rebecca -Original Message- From: Jose Iparraguirre [mailto:jose.iparragui...@ageuk.org.uk] Sent: Friday, March 22, 2013 11:25 AM To: Yuan, Rebecca; R help Subject: RE: error while

Re: [R] error while extracting the p-value from adf.test

2013-03-22 Thread Yuan, Rebecca
Hello Sarah, Thanks! I will look into help next time before sending out the question. Thanks, Rebecca -Original Message- From: Sarah Goslee [mailto:sarah.gos...@gmail.com] Sent: Friday, March 22, 2013 10:22 AM To: Yuan, Rebecca Cc: R help Subject: Re: [R] error while extracting the p

[R] error while extracting the p-value from adf.test

2013-03-22 Thread Yuan, Rebecca
because the "-" between "p" and "value"? Thanks, Rebecca -- This message, and any attachments, is for the intended r...{{dropped:5}} __ R-help@r-projec

Re: [R] How could I specify "no interception term" in arima?

2013-03-21 Thread Yuan, Rebecca
Hello Rui, Thanks! I get it now. Should have read the documentation carefully! Cheers, Rebecca -Original Message- From: Rui Barradas [mailto:ruipbarra...@sapo.pt] Sent: Thursday, March 21, 2013 2:46 PM To: Yuan, Rebecca Cc: R help Subject: Re: [R] How could I specify "no interce

Re: [R] easy way of paste

2013-03-21 Thread Yuan, Rebecca
Hello A.K., Thanks! I use collapse instead of sep and get the answer. Cheers, Rebecca -Original Message- From: arun [mailto:smartpink...@yahoo.com] Sent: Thursday, March 21, 2013 11:21 AM To: Yuan, Rebecca Cc: R help Subject: Re: [R] easy way of paste  dat2<-as.data.frame(matrix(1

Re: [R] easy way of paste

2013-03-21 Thread Yuan, Rebecca
Hello Sarah, Yes, that is what I want. Thanks! Cheers, Rebecca -Original Message- From: Sarah Goslee [mailto:sarah.gos...@gmail.com] Sent: Thursday, March 21, 2013 11:21 AM To: Yuan, Rebecca Cc: R help Subject: Re: [R] easy way of paste It looks like you want collapse rather than

[R] easy way of paste

2013-03-21 Thread Yuan, Rebecca
p)[1:5],sep="+") > a [1] "aa" "dummy1" "dummy2" "bb" "cc" But it will not give me the way I want. Thanks, Rebecca ---

Re: [R] How to store data frames into pdf file and csv file.

2013-03-21 Thread Yuan, Rebecca
Hello Jim, Thanks very much! This time I am able to get the pdf file. Best regards, Rebecca From: jim holtman [mailto:jholt...@gmail.com] Sent: Thursday, March 21, 2013 10:04 AM To: Yuan, Rebecca Cc: R help Subject: Re: [R] How to store data frames into pdf file and csv file. Here is the

Re: [R] How to store data frames into pdf file and csv file.

2013-03-21 Thread Yuan, Rebecca
Hello Jim, This graphics.off() helps me to release the previous pdf file that was had the error message. Thanks again for your help! Cheers, Rebecca From: jim holtman [mailto:jholt...@gmail.com] Sent: Thursday, March 21, 2013 10:07 AM To: Yuan, Rebecca Cc: R help Subject: Re: [R] How to store

[R] How could I specify "no interception term" in arima?

2013-03-21 Thread Yuan, Rebecca
Hello, I cannot find it in ?arima, does someone know how to specify "no interception" term in arima? Thanks, Rebecca -- This message, and any attachments, is for the intended r...{

Re: [R] How to store data frames into pdf file and csv file.

2013-03-21 Thread Yuan, Rebecca
l.summary.out,collapse='\n'),family='mono') dev.off() I believe this time we try to use pdf to catch the graph via text, are we? Thanks, Rebecca From: jim holtman [mailto:jholt...@gmail.com] Sent: Thursday, March 21, 2013 9:44 AM To: Yuan, Rebecca Cc: R help S

[R] Could I get the following stats from arima()?

2013-03-21 Thread Yuan, Rebecca
How can I get the following stat from arima? Pr(>|t|) r2 adjust_r2 rmse Thanks, Rebecca -- This message, and any attachments, is for the intended r...{{dropped:5}} __ R-hel

[R] How to store data frames into pdf file and csv file.

2013-03-21 Thread Yuan, Rebecca
frame, such as > st = data.frame(est.aic, est.aic) > st est.aic est.aic.1 1 -1654.986 -1654.986 How could I save it to a .csv file? Thanks very much! Cheers, Rebecca -- This message

Re: [R] How to look at the source code for predict()

2013-03-21 Thread Yuan, Rebecca
Hello Rui, This also works! Thanks so much! Cheers, Rebecca -Original Message- From: Rui Barradas [mailto:ruipbarra...@sapo.pt] Sent: Wednesday, March 20, 2013 3:34 PM To: Yuan, Rebecca Cc: 'R help' Subject: Re: [R] How to look at the source code for predict() Hello, In t

Re: [R] How to look at the source code for predict()

2013-03-20 Thread Yuan, Rebecca
Hello Duncan, Thanks for this link! A very good article that has useful information! Best, Rebecca -Original Message- From: Duncan Murdoch [mailto:murdoch.dun...@gmail.com] Sent: Wednesday, March 20, 2013 2:53 PM To: Yuan, Rebecca Cc: 'R help' Subject: Re: [R] How to l

Re: [R] How to look at the source code for predict()

2013-03-20 Thread Yuan, Rebecca
Hello MW, Thanks very much! I use > getS3method("predict","arima0") And be able to see the source code. Have a great day! Cheers, Rebecca -Original Message- From: R. Michael Weylandt [mailto:michael.weyla...@gmail.com] Sent: Wednesday, March 20, 2013 2:52

Re: [R] How to look at the source code for predict()

2013-03-20 Thread Yuan, Rebecca
Hello all, I thought I found it, it is in the arima.R if I use arima to fit the model. But how could we see the source code of some function in R? Thanks, Rebecca From: Yuan, Rebecca Sent: Wednesday, March 20, 2013 2:38 PM To: R help Subject: How to look at the source code for predict

Re: [R] How to get the t-stat for arima()?

2013-03-20 Thread Yuan, Rebecca
Hello Rui, Thanks very much! This works! Cheers, Rebecca -Original Message- From: Rui Barradas [mailto:ruipbarra...@sapo.pt] Sent: Tuesday, March 19, 2013 6:26 PM To: Yuan, Rebecca Cc: R help Subject: Re: [R] How to get the t-stat for arima()? Hello, Sorry for the error, the sqrt(n

[R] How to look at the source code for predict()

2013-03-20 Thread Yuan, Rebecca
Hello, I try to look at the source code of predict() it turns out that I cannot find it. I can see it with debug(library), but not efficient. Can someone help? Thanks, Rebecca -- This message, and any attachments, is for

[R] How to get the t-stat for arima()?

2013-03-19 Thread Yuan, Rebecca
Hello all, fit = arima() and Summary(fit) will give some summary of the fit. However, the t-stats are not shown in the summary. How can I get the t-stats of it? Thanks, Rebecca -- This message, and any attachments, is for the

Re: [R] To convert a quarterly data to a monthly data.

2013-02-20 Thread Yuan, Rebecca
int(qtrly$rDate, qtrly[,names(qtrly)[i]] ,subset(mthly, rDate <= max(qtrly$rDate))$rDate )) where qtrly is the quarterly data and mthly is the monthly data. Cheers, Rebecca -Original Message- From: Rolf Turner [mailto:rolf.tur...@xtra.co.nz] Sent: Wednesday, February 20, 2013 3:14

[R] To convert a quarterly data to a monthly data.

2013-02-20 Thread Yuan, Rebecca
to convert monthly data to quarterly data, not the way I need. Is there any library or function in R can do that? Thanks very much! Cheers, Rebecca -- This message, and any attachments, is for the intended r...{

Re: [R] Range difference of plot two arrays in one plot

2013-02-01 Thread Yuan, Rebecca
Hello David, When I used the same ylim for both plots, I got what I need: x = c(0,0,0,10,20,30) y = c(40,50,60,70,80,90) plot(x, type='o', ylim=c(min(x,y),max(x,y))) par(new=T) plot(y, type='l', ylim=c(min(x,y),max(x,y))) Thanks, Rebecca -Original Message- F

[R] Range difference of plot two arrays in one plot

2013-02-01 Thread Yuan, Rebecca
oints from those two arrays are overlapping together, but the value 30 is not equal to 90. How could I draw those two arrays in one plot with their real values shown in the plot? i.e., x is in the lower part of the plot and y is in the upper part of the plot. Thanks very muc

[R] fSeries not found in R

2013-01-30 Thread Yuan, Rebecca
Hello all, When I tried to install fSeries in R, I got the following error messages: install.packages("fSeries",dependencies=T) Warning message: package 'fSeries' is not available (for R version 2.15.2) Is this package changing/merging to another packag

Re: [R] to check if a character string is in a group of character strings

2013-01-23 Thread Yuan, Rebecca
Hello Duncan, Thanks for this! This works! Best, Rebecca -Original Message- From: Duncan Murdoch [mailto:murdoch.dun...@gmail.com] Sent: Wednesday, January 23, 2013 11:23 AM To: Yuan, Rebecca Cc: R help Subject: Re: [R] to check if a character string is in a group of character

[R] to check if a character string is in a group of character strings

2013-01-23 Thread Yuan, Rebecca
Hello, How can I judge if a string is in a group of string? For example, I would like to have if (subpool in pool){ }else{ } Where > pool = c("s1","s2") > subpool = c("s1") How can I write the "subpool in pool" ri

Re: [R] plot two time series with different length and different starting point in one figure.

2013-01-22 Thread Yuan, Rebecca
Hello Arun, Thanks very much! In this way, it works! I convert both A and B to the same day of the month, and therefore there is no NA shown for different last business day and last calendar day of the month. You are very help! Cheers, Rebecca -Original Message- From: arun

Re: [R] plot two time series with different length and different starting point in one figure.

2013-01-22 Thread Yuan, Rebecca
o not know how to do it. Thanks, Rebecca -Original Message- From: David Winsemius [mailto:dwinsem...@comcast.net] Sent: Tuesday, January 22, 2013 2:34 PM To: Yuan, Rebecca Cc: R help Subject: Re: [R] plot two time series with different length and different starting point in one figur

Re: [R] plot two time series with different length and different starting point in one figure.

2013-01-22 Thread Yuan, Rebecca
NA NA Does R have a function to convert the date to some format of Sep,2012, therefore when I merge those two, they will not have those NA numbers... Thanks, Rebecca -Original Message- From: arun [mailto:smartpink...@yahoo.com] Sent: Tuesday, January 22, 2013 2:15 PM

Re: [R] plot two time series with different length and different starting point in one figure.

2013-01-22 Thread Yuan, Rebecca
must specify uniquely valid column(s) To plot A and B in one plot is to compare the difference between them... Any other thoughts? Thanks, Rebecca -Original Message- From: PIKAL Petr [mailto:petr.pi...@precheza.cz] Sent: Tuesday

[R] plot two time series with different length and different starting point in one figure.

2013-01-22 Thread Yuan, Rebecca
would have one data point from A and from Mar, 2012-Nov, 2012, it would have two data points from A and B, and in December 2012, it would have one data point from A. Thanks very much! Cheers, Rebecca -- This message, and any

Re: [R] A smart way to use "$" in data frame

2013-01-22 Thread Yuan, Rebecca
Hello Greg, Thanks very much! This helps! Cheers, Rebecca From: Greg Snow [mailto:538...@gmail.com] Sent: Friday, January 18, 2013 5:17 PM To: Yuan, Rebecca Cc: R help Subject: Re: [R] A smart way to use "$" in data frame The important thing to understand is that $ is a shortcut

[R] A smart way to use "$" in data frame

2013-01-18 Thread Yuan, Rebecca
5 23 datab$oldbalance[datab$oldstate== 'AR' ] 1234 5673 Could I have a way to quote data$balance[data$state == 'AR'] in general, where balance=oldbalance, state=oldstate when data=dataa, and balance = newbalance, state = newstate when data=datab ? Thank

Re: [R] How to cut the time format short

2013-01-16 Thread Yuan, Rebecca
Hello Ellison, Thanks very much! I use the substr() and it works! Have a great day! Cheers, Rebecca -Original Message- From: S Ellison [mailto:s.elli...@lgcgroup.com] Sent: Wednesday, January 16, 2013 1:35 PM To: Yuan, Rebecca; R help Subject: RE: How to cut the time format short

[R] How to cut the time format short

2013-01-16 Thread Yuan, Rebecca
Hello all, I have a time format looks like 31JAN2002:00:00:00.000 How could I cut it to 31JAN2002 ? I tried with format() but not work. Thanks, Rebecca -- This message, and any attachments, is for the intended r

Re: [R] suggestions about import SAS results to R.

2013-01-03 Thread Yuan, Rebecca
//Documents and Settings/test_20130103.xls",readOnly=TRUE); age20 <- sqlFetch(channel,"age=20",as.is=TRUE); odbcClose(channel) The error message shows that "External table is not in the expected format." -- Is this related to the warning message in

Re: [R] suggestions about import SAS results to R.

2013-01-02 Thread Yuan, Rebecca
Hello Ista, Thanks for mention this package, however, it will not support big file, where I got the error message: -- Error in read.sas7bdat("C:/Documents and Settings/test.sas7bdat") : big endian files are not supported -- Cheers

Re: [R] suggestions about import SAS results to R.

2013-01-02 Thread Yuan, Rebecca
- require(foreign) rm(list=ls()) sashome <- "C:/Program Files/SAS/SASFoundation/9.2/" checkfile <- read.ssd("C:/Documents and Settings/test","sales",sascmd = file.path(sashome, "sas.exe")) ----

[R] suggestions about import SAS results to R.

2013-01-02 Thread Yuan, Rebecca
! Cheers, Rebecca -- This message, and any attachments, is for the intended r...{{dropped:5}} __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do

Re: [R] Read many cvs files

2013-01-02 Thread Yuan, Rebecca
I know that R can read cvs file, but could R read excel files? For example, in the workbook, I have 3 sheets. How could I read for those three sheets? Thanks, Rebecca -Original Message- From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] On Behalf Of jim

[R] bootstrap based confidence band

2012-12-05 Thread Rebecca
I'm trying to find a bootstrap based confidence band for a linear model. I have created a data set with X and Y X=runif(n,-1.25,1.25) e=rnorm(n,0,1) Y=exp(3*X)+5*sin((30*X)/(2*pi))+2*e fit=lm(Y~X) summary(fit)   I define a bootstrap function named PairedBootstrap which is not listed here. Than I t

[R] R package fields: Thin-plate splines question

2012-08-31 Thread Rebecca Clark
ction and subsequent method to separate the two plots (this would also require rearrangement of the data frame). However, I am stumped on the particulars. Does anyone have an idea of how to do this? I am including (hopefully reproducible) syntax for the two separate surfaces below. Thank y

[R] find the eigenvector corresponding to the largest eigenvalue

2012-04-27 Thread Rebecca
Hi, If I use the eigen() function to find the eigenvalues of a matrix, how can I find the eigenvector corresponding to the largest eigen value? Thanks! [[alternative HTML version deleted]] __ R-help@r-project.org mailing list https://stat.ethz.c

[R] reorder a matrix

2012-04-26 Thread Rebecca
Hi, Here are part of my data, > pr16.5    origin dest ldco time.slot distortion 1   1    1    1 1    4.3 2   1    1    1 2    4.7 3   1    1    1     3    5.6 4   1    1    1 4    7.7 5   1    1    2 1    6.8 6  

[R] reorder a matrix

2012-04-25 Thread Rebecca
Hi, Here are part of my data, > pr16.5    origin dest ldco time.slot distortion 1   1    1    1 1    4.3 2   1    1    1 2    4.7 3   1    1    1     3    5.6 4   1    1    1 4    7.7 5   1    1    2 1    6.8 6 

[R] repeat matrix rows as a whole

2012-04-25 Thread Rebecca
Hi, If I have a matrix like 1  2  3  4 5  6  7  8, how can I repeat two rows as whole, to be like 1  2  3  4 5  6  7  8 1  2  3  4 5  6  7  8?   Since I have more two rows in a matrix and I need to repeat many times, I wonder whether there is a convenient command to do so.   Thanks! [[alte

[R] question on simple graph

2012-01-31 Thread Rebecca Lisi
I am having trouble generating a graph. I want to know the % of respondents who answered that they "strongly agree" or "agree" the "America owes R's ethnic group a better chance" (BTTRCHNC) and I want to organize it by racial group (RACESHRT). "BTTRCHNC" is organized ordinally from 1 through 5 wi

[R] difference between foo$a[2] <- 1 and foo[2,"a"] <- 1

2011-11-02 Thread Rebecca Hiller
oo$a[1] <- 1 > foo$b[1] <- 2 > foo$a[2] <- 1 Error in `$<-.data.frame`(`*tmp*`, "a", value = c(1, 1)) : replacement has 2 rows, data has 1 > foo[2,"a"] <- 1 > foo a b 1 1 2 2 1 NA Thanks, Rebecca Hiller -- ETH Zürich Rebecca Hiller Institute of

[R] random sampling but with caveats!

2011-09-08 Thread Rebecca Ross
Hi, I wonder if someone can help me. I have built a gam model to predict the presence of cold water corals and am now trying to evaluate my model by splitting my dataset into training/test datasets. In an ideal world I would use the sample() function to randomly select rows of data for me so fo

[R] gsub for numeric characters in string

2011-08-19 Thread Rebecca Gray
; that is, I have not removed the names from the string so that now the state information is wrong. If anyone can help with the proper code to get rid of the names in tree while replacing the length with lengthplustate, I would appreciate it. I apologize if this was unclear. All the best,

Re: [R] gsub wildcard

2011-08-15 Thread Rebecca Gray
d there are many more "[" that are unaffected. Rebecca On Mon, Aug 15, 2011 at 6:40 PM, Peter Langfelder < peter.langfel...@gmail.com> wrote: > On Mon, Aug 15, 2011 at 10:34 AM, Rebecca Gray wrote: > > Hello all, > > > > I have what I think is a simple qu

[R] gsub wildcard

2011-08-15 Thread Rebecca Gray
quot;states" with the period - not retaining the original value as I thought the wildcard character would. Any help is most appreciated! Thanks Rebecca [[alternative HTML version deleted]] __ R-help@r-project.org mailing list https://stat.ethz

[R] plotting the ending point in a for loop

2011-07-27 Thread Rebecca Gray
Hello, I would appreciate if someone could help me with this query. I would like to plot a line chart of all of the points in a "for" loop. I would also like to plot the final point with a symbol (to show where the random walk ends). Here is the code I am using: Brownian.fn <- function(mu, sigma

[R] pvclust package

2010-08-16 Thread Holt, Hannah Rebecca
I have been using the pvclust package to perform hierarchical clustering with bootstrapped p-values. I am using it to compare the numbers of clusters identified between different datasets. However, the numbers are not comparable because pvclust calculates p-values for the optimal number of clusters

[R] (no subject)

2010-08-09 Thread Holt, Hannah Rebecca
Hi there, I have been trying to use the "pvclust" package but have been having some difficulties. This is the first time I have used R so I am sure the mistake I am making is a basic one. The data I have is a distance matrix and I have been using the command; fit <- pvclust(cluster, nboot=1000,

[R] Specify contrasts in R

2010-08-02 Thread Rebecca Ross
problem using this contrast set-up in a mixed model? I am not sure how the 'block' effect would be interpreted for the mid-parent values, or indeed if it is sensible to include it as a random effect. Thank you in advance for your help, Rebecca Ross

[R] LMM and unequal variances

2010-05-26 Thread Rebecca Lawrence
Hi all, I am running a LMM and have two fixed factors: Trt (with 2 levels) and Microhabitat (with 3 levels), and a randon factor: Group nested within Trt. I have unequal variances between the two Trt levels. Does this matter in a LMM? Thanks for your time Rebecca [[alternative HTML

[R] Zero inflated negative binomial

2010-03-03 Thread Rebecca Lawrence
el 1 there is no Micro level 3. I cannot find a solution to this problem, is there any way I can solve this so I can run the zero inflated model? Thank you for your time Rebecca [[alternative HTML version deleted]] __ R-help@r-project.

[R] Correct nested design for GLM

2010-03-02 Thread Rebecca Lawrence
cro is nest within Trt and Trt is nested with Year (0 + Micro/Trt/Year). I was hoping someone could confirm that this is actually what the model is running? Thank you very much for your time, Rebecca [[alternative HTML version deleted]] __ R-

[R] RPART - printing full splitting rule number on tree plot

2009-12-13 Thread Rebecca O'Leary
? Below is an example. library(rpart) temp <- as.data.frame(cbind(kyphosis, Start2=kyphosis$Start)) temp$Start2 <- temp$Start2+1 fit1 <- rpart(Age~ Kyphosis +Number + Start2, data=temp) plot(fit1) text(fit1, use.n=TRUE, digits=5) Thanks Dr Rebecca O&#

[R] Linking in R package documentation

2009-08-09 Thread Rebecca Sela
name in another package? I thought I could use something like: \seealso{\code{\link[nlme]{ranef}}} but that gives a Page Not Found. Thank you in advance! Rebecca __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE

Re: [R] \dQuote in packages

2009-07-13 Thread Rebecca Sela
Thank you! (That was easy to fix.) How does one deal with quoting (in \reference)? The following line causes problems: \references{Sela, Rebecca J., and Simonoff, Jeffrey S., \dQuote{RE-EM Trees: A New Data Mining Approach for Longitudinal Data}.} The error given is: Warning in parse_Rd

Re: [R] \dQuote in packages

2009-07-10 Thread Rebecca Sela
ted to the target variable)} } \references{Sela, Rebecca J., and Simonoff, Jeffrey S., \dQuote{RE-EM Trees: A New Data Mining Approach for Longitudinal Data}.} \keyword{datasets} Thanks again for your help! Rebecca - Original Message - From: "Uwe Ligges" To: "Rebecca

Re: [R] \dQuote in packages

2009-07-08 Thread Rebecca Sela
w to assemble a package in Windows.) Thank you for your help! Rebecca - Original Message - From: "Uwe Ligges" To: "Rebecca Sela" Cc: "r-help" Sent: Wednesday, July 8, 2009 6:11:33 PM GMT -05:00 US/Canada Eastern Subject: Re: [R] \dQuote in packages The d

[R] \dQuote in packages

2009-07-08 Thread Rebecca Sela
UNKNOWN '\sideeffects' Warning in parse_Rd("./man/simpleREEMdata.Rd", encoding = "unknown") : ./man/simpleREEMdata.Rd:10: unknown macro '\item' Are \dquote, \sideeffects, and \item not supported in newer versions of R? Is there some und

[R] Problems with subsets in NLME

2009-06-25 Thread Rebecca Sela
this list as well.) Thank you! Rebecca -- Rebecca Sela IOMS/Statistics Group Stern School of Business New York University __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting guide http://www.R-pro

[R] No CHM file

2009-06-03 Thread Rebecca Sela
ckage was built under an older version of R? Or is there some other way to ensure that the Help files show up properly? Thanks in advance. Rebecca __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting

[R] "Error: package/namespace load failed"

2009-05-27 Thread Rebecca Sela
ompiled C or Fortran code, but I have none of that in my code. I imagine this is a simple problem (perhaps with my NAMESPACE file), but I don't know what it is. (The text of the NAMESPACE file is at the bottom of this e-mail.) Thank you in advance for your help! Rebecca NAMESPACE

Re: [R] Checking a (new) package - examples require other package functions

2009-05-16 Thread Rebecca Sela
FALSE, domain = NA) 1: library(package, lib.loc = lib.loc, character.only = TRUE, verbose = FALSE) Execution halted I have attached the NAMESPACE file in case that is where the problem is. Thanks again for your help! Rebecca - Original Message - From: "Duncan Murdoch" To: &quo

[R] Checking a (new) package - examples require other package functions

2009-05-13 Thread Rebecca Sela
I refer to other functions from the package in examples? (I have the "Writing R-extensions" PDF, so it would be enough to point me to the right page, if the answer is in there and I just missed it.) Thanks! Rebecca __ R-help@r-project.org mail

[R] generate individual panel keys/legends in lattice barchart

2009-04-23 Thread Rebecca Fisher
ter trying several iterations, I could not get it to work. any help you could give would be great, Regards, Rebecca. # code to reproduce my graph # my_subcat_data <- structure(list(subcat = structure(c(9L, 6L, 1L, 3L, 11L, 5L, 12L, 10L, 2L, 4L, 7L, 8L, 9L, 6L

[R] DLM and matrices with 0 eigenvalues

2009-02-19 Thread Rebecca Sela
as I can tell, the reason is that one of R's computed eigenvalues is very slightly negative (something like -5E-17). Is there a way to work around this? Thanks! Rebecca __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r

[R] Three questions about DSE

2009-02-05 Thread Rebecca Sela
case with the attached code.) Is there a known reason why this sometimes occurs? Thank you in advance for all of your help! Rebecca -- Rebecca Sela Doctoral Candidate Statistics Group/IOMS Stern School of Business__ R-help@r-project.org mailing list

  1   2   >