Re: [R] Dataframe of factors transform speed?

2007-07-20 Thread Latchezar Dimitrov
Hi, -Original Message- From: Benilton Carvalho [mailto:[EMAIL PROTECTED] Sent: Friday, July 20, 2007 12:25 AM To: Latchezar Dimitrov Cc: r-help@stat.math.ethz.ch Subject: Re: [R] Dataframe of factors transform speed? it looks like that whatever method you used to genotype the

Re: [R] Dataframe of factors transform speed?

2007-07-20 Thread Benilton Carvalho
set.seed(123) genoT = lapply(1:24, function(i) factor(sample(c(AA, AB, BB), 1000, prob=sample(c(1, 1000, 1000), 3), rep=T))) names(genoT) = paste(snp, 1:24, sep=) genoT = as.data.frame(genoT) dim(genoT) class(genoT) system.time(out - lapply(genoT, function(x) match(x, c(AA, AB,

[R] GEE code

2007-07-20 Thread Chris Linton
I'm writing a paper aimed at motivating the use of GEE within the field of economics. However, after computing using the geeglm function, I noticed there's one intercept in the summary output. I assume this means the function is pooling the data. That means my code is not what I want. I want a

[R] custom point shapes

2007-07-20 Thread baptiste Auguié
Hi, I'm new to R, but a search through the list didn't quite solve this problem: I want to draw a few ellipses (or any custom shape for that matter) at given locations in a graph. I know how to plot points from my data, set the point type pch to any built in value, but I do not know how

Re: [R] Help with Dates

2007-07-20 Thread Achim Zeileis
Alex: I am taking an excel dataset and reading it into R using read.table. This sets up a data.frame object. The data you have are probably more conveniently represented as a time series, storing the date in an appropriate format, e.g., in class Date. (actually I am dumping the data into a

Re: [R] GEE code

2007-07-20 Thread Dimitris Rizopoulos
from your description I think you need a random-effects model. Since you assume normality the parameter estimates from a random-effects model (in your case `GDP.log2') have a marginal interpretation (in fact they have both conditional and marginal interpretation). Thus, you could also use

[R] binned column in a data.frame

2007-07-20 Thread João Fadista
Dear all, I would like to know how can I create a binned column in a data.frame. The output that I would like is something like this: Start Binned_Start 10-5 20-5 65-10 85-10 13 10-15 ... Best regards João Fadista Ph.d. student

Re: [R] Trend lines on a scatterplot matrix

2007-07-20 Thread Mark Difford
Hi Alan, There is a good, ready made, way of doing this, with additional options, in Professor Fox's car package. See:--- require(car) ?scatterplot.matrix Cheers, Mark. Alan S Barnett-2 wrote: I'm using pairs() to generate a scatterplot matrix; pairs(~

Re: [R] plot3d labels

2007-07-20 Thread Birgit Lemcke
Hello Jim, thanks for your answer but I still have problems with the labels. Perhaps you can help me a second time. I have the output of cmdscale and it looks like this: [,1] [,2] [,3] Anth_cap -0.011833788 -0.1091355289 -0.0222467839 Anth_crin

Re: [R] binned column in a data.frame

2007-07-20 Thread Mike Meredith
Try something like this: x - c(1,2,6,8,13,0,5,10, runif(10) * 100) tmp - x %/% 5 + 1 bin.names - paste((0:19) * 5, (1:20) * 5, sep=-) data.frame(Start = x, Binned_Start = bin.names[tmp]) This assumes you want (eg.) 5 in the 5-10 bin, not the 0-5 bin. You may also want to make Binned_Start into

Re: [R] plot3d labels

2007-07-20 Thread Duncan Murdoch
On 20/07/2007 5:23 AM, Birgit Lemcke wrote: Hello Jim, thanks for your answer but I still have problems with the labels. Perhaps you can help me a second time. I have the output of cmdscale and it looks like this: [,1] [,2] [,3] Anth_cap

Re: [R] (R) Using arguments for the empirical cumulative distribution function

2007-07-20 Thread squall44
Is there no one who can help me? :,( -- View this message in context: http://www.nabble.com/%28R%29-Using-arguments-for-the-empirical-cumulative-distribution-function-tf4111355.html#a11705448 Sent from the R help mailing list archive at Nabble.com.

Re: [R] custom point shapes

2007-07-20 Thread Dieter Menne
baptiste Auguié ba208 at exeter.ac.uk writes: I'm new to R, but a search through the list didn't quite solve this problem: I want to draw a few ellipses (or any custom shape for that matter) at given locations in a graph. I know how to plot points from my data, set the point type pch to

Re: [R] (R) Using arguments for the empirical cumulative distribution function

2007-07-20 Thread Mike Lawrence
?plot.ecdf() On 20-Jul-07, at 6:57 AM, squall44 wrote: Is there no one who can help me? :,( -- View this message in context: http://www.nabble.com/%28R%29-Using- arguments-for-the-empirical-cumulative-distribution-function- tf4111355.html#a11705448 Sent from the R help mailing list

Re: [R] how to determine/assign a numeric vector to Y in the cor.test function for spearman's correlations?

2007-07-20 Thread Uwe Ligges
G. wrote: Hello to all of you, R-expeRts! I am trying to compute the cor.test for a matrix that i labelled mydata according to mydata=read.csv... then I converted my csv file into a matrix with the mydata=as.matrix(mydata) NOW, I need to get the p-values from the correlations... I can

Re: [R] Can I test if there are statistical significance between different rows in R*C table?

2007-07-20 Thread Uwe Ligges
zhijie zhang wrote: Dear friends, My R*C table is as follow: better good bad Goup1 16 71 37 Group2 0 4 61 Group3 1 6 57 Can I test if there are statistical significant between Group1 and Group2, Group2 and Group3, Group1 and Group2,

Re: [R] plot centered line on barplot

2007-07-20 Thread Uwe Ligges
[EMAIL PROTECTED] wrote: Dear R user, I need plot an histogram for the occurrence of a dataset, and then add a line corresponding to the freuqnecy of another similar dataset. in order to do this i used the function hist_data1=hist(data1, breaks= seq(0,50,5), plot=FALSE)

Re: [R] plot3d labels

2007-07-20 Thread Birgit Lemcke
Thanks a lot for this really time saving method compared to mine. Greetings Birgit Am 20.07.2007 um 11:53 schrieb Duncan Murdoch: On 20/07/2007 5:23 AM, Birgit Lemcke wrote: Hello Jim, thanks for your answer but I still have problems with the labels. Perhaps you can help me a second

[R] RDCOM and R versions

2007-07-20 Thread Paul
Dear R-helpers, I have several versions of R installed on my computer, and I cannot do without any of these. However RCDOM seems to authorize only one version installed. Do you know any means to overcome this problem ? Thank you very much for your response. Paul Poncet

Re: [R] exclude1 in summary.formula from Hmisc

2007-07-20 Thread Frank E Harrell Jr
david dav wrote: Dear Users, Still having troubles with sharing my results, I'm trying to display a contingency table using summary.formula. Computing works well but I'd like to display information on redundant entries say, males AND females. Please tell us what output you got. And it is

Re: [R] RDCOM and R versions

2007-07-20 Thread Prof Brian Ripley
There is a separate list for support of RDCOM at http://mailman.csd.univie.ac.at/mailman/listinfo/rcom-l The answer to your question depends a bit how you are making use of RDCOM: the R interface is via rproxy.dll, and that recognizes R_HOME. This is also mentioned in the installation

[R] cv.glm error function

2007-07-20 Thread Rachel Davidson
I have a couple quick questions about the use of cv.glm for cross-validation. 1. If we have a Poisson GLM with counts Y~Poisson(mu) and ln(mu)=beta0+beta1*x1+..., is the prediction error (delta) that is output from cv.glm provided in terms of the counts (y) or the (mu)? 2. Can cv.glm be used for

Re: [R] binned column in a data.frame

2007-07-20 Thread jim holtman
You can also use 'cut' to break the bins: x - c(1,2,6,8,13,0,5,10, runif(10) * 100) x.bins - seq(0, max(x)+5, 5) x.cut - cut(x, breaks=x.bins, include.lowest=TRUE) x.names - paste(head(x.bins, -1), tail(x.bins, -1), sep='-') data.frame(x, bins=x.names[x.cut]) x bins 1 1.0

[R] how do I draw such a barplot?

2007-07-20 Thread Donatas G.
I did not have much success with ggplot2 and reshape libraries, so finally I managed to work out the graph in a rather complicated way. The only thing I cannot figure out is, how do I place the legend outside the barplot column area? attach(tolerancija.data) ateist = table(G09_01) dvasin =

Re: [R] (R) Using arguments for the empirical cumulative distribution function

2007-07-20 Thread AA
Hi Tobias, Maybe I do not understand the issue here but the following line adds main and xlab plot(F10,verticals = TRUE, do.p = TRUE, lwd = 3, main = myTitle, xlab = myXlab) You could find all this in the introduction manual. see r-project.org in the documentation section. Good luck AA. -

[R] Huh?

2007-07-20 Thread Susan Parham
Vipxiltxyagdohhrfhxrhra $1.79 Cnkwqaffsuaialepqyemfris = $3.93 and many other items for 10% of the price. [1]Click to visit the shop _ References 1. file://localhost/tmp/tmpuDywbA.html

[R] R CMD SHLIB problem [make: *** No rule to make target ]

2007-07-20 Thread Diogo Alagador
Hy all, I apologize for my ingenuity in regard to interfaces in R, but I do need it for my work. In that respect I took a simple and small example from the net (the hello world, one) to interface R with C. I have a Windows XP OS using R.2.5.0 and in that regard I have installed the Perl and

[R] Graphical Parameters

2007-07-20 Thread amna khan
Hi Sir There is a difficulty in creating a comprehensive graph. Suppose I have a time series from 1967 to 2006. I have used the following R code for creating a graph. plot(Year,Dir,ylab=Annual Maximum Daily Rainfall (mm),cex.lab=1.3 ,type=o,lab=c(20,20,25),mgp=c(2.5,1,0),tck=1) The graph is

[R] presence/absence matrix

2007-07-20 Thread [EMAIL PROTECTED]
I have a table such that: sample # species 1a 1b 2a 2c 3b and i would like to build a matrix with species names (i.e. a b and c) as field names and samples (i.e. 1,2 and 3) as row names and 1/0 as inner values such as: a b c 1 1 1 0 2 1 0 1 3

[R] R CMD SHLIB problem [make: *** No rule to make target ]

2007-07-20 Thread Diogo Alagador
Hy all, I apologize for my ingenuity in regard to interfaces in R, but I do need it for my work. In that respect I took a simple and small example from the net (the hello world, one) to interface R with C. I have a Windows XP OS using R.2.5.0 and in that regard I have installed the Perl and

Re: [R] presence/absence matrix

2007-07-20 Thread Francisco J. Zagmutt
See ?table i.e. x sample # species 11 a 21 b 32 a 42 c 53 b table(x) species sample # a b c 1 1 1 0 2 1 0 1 3 0 1 0 Regards, Francisco Francisco J. Zagmutt [EMAIL PROTECTED] wrote:

[R] SOS

2007-07-20 Thread Fabrice McShort
Dear all, I am a new user of R. I would like to know how to get fund's returns in percentage (%). For example, I use: R - ts(read.xls(FundData), frequency = 12, start = c(1996, 1)) Whith this program, the returns are like 0.0152699. But, I would like to have 1.52%. Please advise me about the

Re: [R] cv.glm error function

2007-07-20 Thread Prof Brian Ripley
On Fri, 20 Jul 2007, Rachel Davidson wrote: I have a couple quick questions about the use of cv.glm for cross-validation. 1. If we have a Poisson GLM with counts Y~Poisson(mu) and ln(mu)=beta0+beta1*x1+..., is the prediction error (delta) that is output from cv.glm provided in terms of the

Re: [R] presence/absence matrix

2007-07-20 Thread Stefano Calza
What about table(sample,species) Stefano On Fri, Jul 20, 2007 at 04:16:39PM +0200, [EMAIL PROTECTED] wrote: rocchiniI have a table such that: rocchini rocchinisample # species rocchini1a rocchini1b rocchini2a rocchini2c rocchini3b rocchini rocchiniand i would like

Re: [R] presence/absence matrix

2007-07-20 Thread Ted Harding
On 20-Jul-07 14:16:39, [EMAIL PROTECTED] wrote: I have a table such that: sample # species 1a 1b 2a 2c 3b and i would like to build a matrix with species names (i.e. a b and c) as field names and samples (i.e. 1,2 and 3) as row names and 1/0 as inner

Re: [R] SOS

2007-07-20 Thread Julian Burgos
Multiply by 100? Add R=R*100 Fabrice McShort wrote: Dear all, I am a new user of R. I would like to know how to get fund's returns in percentage (%). For example, I use: R - ts(read.xls(FundData), frequency = 12, start = c(1996, 1)) Whith this program, the returns are like 0.0152699.

[R] automatically jpeg output

2007-07-20 Thread Ding, Rebecca
Dear R users, I used R to draw many histograms and I would like to automatically save them into a jpeg file. I tried the following code since I know .ps file could be saved like this way: postscript(AYA_ELA.jpeg,horizontal=F,onefile=T) ..#some funtions inside here dev.off() There was a jpeg

[R] SOS

2007-07-20 Thread Fabrice McShort
Hi Julian, Thank you very much. Please let me know how to get 2 numbers after the decim. Best regards, Fabrice Date: Fri, 20 Jul 2007 08:15:42 -0700 From: [EMAIL PROTECTED] To: [EMAIL PROTECTED] CC: r-help@stat.math.ethz.ch Subject: Re: [R] SOS Multiply by 100? Add R=R*100 Fabrice

Re: [R] automatically jpeg output

2007-07-20 Thread Benilton Carvalho
jpeg(...) ##if you have X11 bitmap(..., type=jpeg) ##otherwise b On Jul 20, 2007, at 11:34 AM, Ding, Rebecca wrote: Dear R users, I used R to draw many histograms and I would like to automatically save them into a jpeg file. I tried the following code since I know .ps file could be

[R] mtext formatting

2007-07-20 Thread Todd Remund
I am trying to create a formatted title using mtext. Using the format function I define the spacing for a specific part of the text then paste these together, when I put this in mtext it does not keep the spacing I defined. Here is an example. x - format(paste(X=, a), width=8) y -

Re: [R] GEE code

2007-07-20 Thread Thomas Lumley
On Fri, 20 Jul 2007, Dimitris Rizopoulos wrote: from your description I think you need a random-effects model. Since he specifically said fixed effects I would have assumed from the description that he wanted a fixed-effects model.

Re: [R] automatically jpeg output

2007-07-20 Thread Ted Harding
On 20-Jul-07 15:34:00, Ding, Rebecca wrote: Dear R users, I used R to draw many histograms and I would like to automatically save them into a jpeg file. I tried the following code since I know .ps file could be saved like this way: postscript(AYA_ELA.jpeg,horizontal=F,onefile=T)

Re: [R] R CMD SHLIB problem [make: *** No rule to make target ]

2007-07-20 Thread Prof Brian Ripley
Please do *not* use paths in your C code, especially those with spaces in. (The rw-FAQ did advise you not to install into a path with spaces in if you wanted to do development work.) The path is not needed for system include files (you used ) and is likely the problem. And please do not post

Re: [R] Dataframe of factors transform speed?

2007-07-20 Thread Charles C. Berry
On Thu, 19 Jul 2007, Latchezar Dimitrov wrote: Hello, This is a speed question. I have a dataframe genoT: dim(genoT) [1] 1002 238304 It looks like these are all numeric originally. Handling these as a vector or matrix will speed things up a bit. You can then stitch together a data.frame:

Re: [R] mtext formatting

2007-07-20 Thread Prof Brian Ripley
On Fri, 20 Jul 2007, Todd Remund wrote: I am trying to create a formatted title using mtext. Using the format function I define the spacing for a specific part of the text then paste these together, when I put this in mtext it does not keep the spacing I defined. Here is an example. x -

Re: [R] Graphical Parameters

2007-07-20 Thread Julian Burgos
Hi Amna, To have more control on the grid of your plot use the grid function. Remove the tck argument from your plot call and add, as following: plot(Year,Dir,ylab=Annual Maximum Daily Rainfall (mm),cex.lab=1.3,type=o,lab=c(20,20,25),mgp=c(2.5,1,0),asp=1) grid() See ?grid to see how to

Re: [R] exclude1 in summary.formula from Hmisc

2007-07-20 Thread Frank E Harrell Jr
david dav wrote: Here is a peace of the data and code : sex -c(2,2,1,1,1,1,1,1,1,2,1,1,1,1,1,2,2,1,1,2,2) AGN - c(C,C,C,C,C,A,A,C,B,B,C,C,C,C,C,C,B,B,C,C,C) X - c(2,2,2,2,1,2,2,2,2,2,1,1,1,1,1,1,1,1,1,2,2) varqual - data.frame(sex,AGN,X) desqual - summary.formula(varqual$X ~.,

Re: [R] exclude1 in summary.formula from Hmisc

2007-07-20 Thread david dav
Here is a peace of the data and code : sex -c(2,2,1,1,1,1,1,1,1,2,1,1,1,1,1,2,2,1,1,2,2) AGN - c(C,C,C,C,C,A,A,C,B,B,C,C,C,C,C,C,B,B,C,C,C) X - c(2,2,2,2,1,2,2,2,2,2,1,1,1,1,1,1,1,1,1,2,2) varqual - data.frame(sex,AGN,X) desqual - summary.formula(varqual$X ~., data = subset( varqual, select =

Re: [R] automatically jpeg output

2007-07-20 Thread Ding, Rebecca
Hi R users, Thanks for the jpeg() function. I do find it. However when I used par(mfrow=c(6,7)), which can put all my histograms in one page, R gave me the error message: Error in plot.new() : figure margins too large. The mfrow=c(6,7)statment was fine in postscript(AYA_ELA.ps). Is there a way

Re: [R] can I paste 'newline'?

2007-07-20 Thread runner
Thanks for replied from you all. I 've got better understanding of what cat/paste does. what I am trying is to make FASTA format data. i.e. for each line starting with '', add '\n' at both ends while get rid of all '\n's for the rest. e.g. this is original messy data, I need to remove newlines

Re: [R] SOS

2007-07-20 Thread jim holtman
You can use sprintf: x - runif(5) x [1] 0.89838968 0.94467527 0.66079779 0.62911404 0.06178627 cat(sprintf(%.2f%% , x * 100)) 89.84% 94.47% 66.08% 62.91% 6.18% On 7/20/07, Fabrice McShort [EMAIL PROTECTED] wrote: Hi Julian, Thank you very much. Please let me know how to get 2 numbers

Re: [R] SOS

2007-07-20 Thread John Kane
?round x - 1.2223 round(x,2) [1] 1.22 --- Fabrice McShort [EMAIL PROTECTED] wrote: Hi Julian, Thank you very much. Please let me know how to get 2 numbers after the decim. Best regards, Fabrice Date: Fri, 20 Jul 2007 08:15:42 -0700 From: [EMAIL PROTECTED] To: [EMAIL

[R] Free Online: Data Mining Intro for Beginners, Vendor-Neutral

2007-07-20 Thread Lisa Solomon
Intro to Data Mining for Absolute Beginners (no charge) This one-hour webinar is a perfect place to start if you are new to data mining and have little-to-no background in statistics or machine learning. -Dates: July 24, August 9, September 7 -Registration: http://salford.webex.com -Future

Re: [R] R CMD SHLIB problem [make: *** No rule to make target ]

2007-07-20 Thread Diogo Alagador
Prof. Ripley, I will follow your suggestion about file spaces. However, as you said the path declared in the #include row is redundant, so I think the problem did not come through that. Meanwhile, after some tries I could compile the file. I just got more attention to case sensitiveness.

[R] Simultaneous logit/probit models

2007-07-20 Thread Min Zou
Dear R Users, I'm currently working on simultaneous multinomial models and wonder whether R has any package that can estimate such models. I've got a survey dataset that contains 2,000 individuals and one of the survey questions asked the respondents to chose two main reasons to work out of

[R] Unrecognising SEXP [C file compilation using .Call]

2007-07-20 Thread Diogo Alagador
Following an exercise suggestion I went to compile a C file, now with the .Call interface to R. The C file is: #include R.h #include Rdefines.h SEXP getInt(SEXP myint, SEXP myintVar) { int Imyint, n; // declare an integer variable int *Pmyint; // pointer to an integer vector

[R] tagging results of apply

2007-07-20 Thread Bernzweig, Bruce \(Consultant\)
In trying to get a better understanding of vectorization I wrote the following code: My objective is to take two sets of time series and calculate the correlations for each combination of time series. mat1 - matrix(sample(1:500, 25), ncol = 5) mat2 - matrix(sample(501:1000, 25), ncol = 5)

[R] main title on splited windows.

2007-07-20 Thread Milton Cezar Ribeiro
Dear all, How can I put a main title on the top of a windows? I would like put a title like This is my for graphics :-) v1-sort(runif(50)) v2-sin(v1*3.14) par(mfrow=c(2,2)) plot(v1,main=Sort V1) plot(v2,main=Sin(V1)) hist(v1,main=Histogram of V1) boxplot(v1,v2, main=Box plot - v1 v2) Thanks

[R] set attribute method question

2007-07-20 Thread Tae-Hoon Chung
Hi, All; Suppose I have a class 'dat' such that setClass('dat', representation (.version='character', x='numeric', y='numeric')). If I want to make a method that changes the .version slot of 'dat' class in a way like set.version(d) - '0.2' when d is an object of 'dat' class, how can I do

Re: [R] main title on splited windows.

2007-07-20 Thread Gavin Simpson
On Fri, 2007-07-20 at 12:16 -0700, Milton Cezar Ribeiro wrote: Dear all, How can I put a main title on the top of a windows? I would like put a title like This is my for graphics :-) Create an outer margin to the plot and pop the title in there, e.g.: ## your data v1-sort(runif(50))

Re: [R] BOA (Bayesian Output Analysis)

2007-07-20 Thread Lucke, Joseph F
From the website: BOA is an R/S-PLUS program for carrying out convergence diagnostics and statistical and graphical analysis of Monte Carlo sampling output. It can be used as an output processor for the BUGS software or for any other program which produces sampling output. See

[R] ?R: Removing white space betwen multiple plots, traditional graphics

2007-07-20 Thread Mr Natural
I would appreciate suggestions for removing the white spaces the graphs in a stack: par(mar=c(2,2,1,1), mfrow = c(6,1)) mydates-dates(1:20,origin=c(month = 1, day = 1, year = 1986)) plot(rnorm(20,0.1,0.1)~mydates, type=b,xlab=,ylim=c(0,1),xaxt = n) plot(rnorm(20,0.2,0.1)~mydates,

Re: [R] ?R: Removing white space betwen multiple plots, traditional graphics

2007-07-20 Thread Achim Zeileis
On Fri, 20 Jul 2007, Mr Natural wrote: I would appreciate suggestions for removing the white spaces the graphs in a stack: par(mar=c(2,2,1,1), mfrow = c(6,1)) mydates-dates(1:20,origin=c(month = 1, day = 1, year = 1986)) plot(rnorm(20,0.1,0.1)~mydates, type=b,xlab=,ylim=c(0,1),xaxt = n)

[R] Column-mean-values for targeted rows

2007-07-20 Thread Diogo Alagador
Hi all, I'm handling massive data.frames and matrices in R (3 x 400). In the 1st column, say, I have 0s and 1s indicating rows that matter; other columns have probability values. One simple task I would like to do would be to get the column mean values for signaled rows (the ones with 1)

Re: [R] Column-mean-values for targeted rows

2007-07-20 Thread Benilton Carvalho
set.seed(123) N = 3 K = 400 theData = matrix(rnorm(N*K), ncol=K) theData = as.data.frame(theData) theData = cbind(indicator = sample(0:1, N, rep=T), theData) system.time(results - colMeans(subset(theData, indicator == 1))) user system elapsed 2.309 1.319 3.853 b On Jul 20,

Re: [R] binned column in a data.frame

2007-07-20 Thread David Katz
Would cut meet your needs? João Fadista wrote: Dear all, I would like to know how can I create a binned column in a data.frame. The output that I would like is something like this: Start Binned_Start 10-5 20-5 65-10 85-10 13 10-15 ...

Re: [R] RDCOM and R versions

2007-07-20 Thread Gabor Grothendieck
On 7/20/07, Paul [EMAIL PROTECTED] wrote: Dear R-helpers, I have several versions of R installed on my computer, and I cannot do without any of these. However RCDOM seems to authorize only one version installed. Do you know any means to overcome this problem ? Thank you very much for

[R] set class attribute method question

2007-07-20 Thread Tae-Hoon Chung
Hi, All; Suppose I have a class 'dat' such that setClass('dat', representation (.version='character', x='numeric', y='numeric')). If I want to make a method that changes the .version slot of 'dat' class in a way like set.version(d) - '0.2' when d is an object of 'dat' class, how can I do

[R] R2WinBUGS awkward to use

2007-07-20 Thread toby909
Hi All Does anyone know if I can avoid to use the write.model() function below? I dont want to do this. Can't bugs() do that automatically for me just by specifying the 4th argument 'model'? Just I like I am also using the 'inits' object! If I use 'model' in the same way as I use 'inits' I am

[R] avoiding timconsuming for loop renaming identifiers

2007-07-20 Thread toby909
Hi All I was wondering if I can avoid a time-consuming for loop on my 60 obs dataset. school_id y 8 9.87 8 8.89 8 7.89 8 8.88 20 6.78 20 9.99 20 8.79 31 10.1 31 11 There are, say, 143 different schools

Re: [R] set class attribute method question

2007-07-20 Thread chenxh007
setReplaceMethod(set.version, c(dat, character), function(object, value) { [EMAIL PROTECTED] - value object }) Xiaohui Tae-Hoon Chung wrote: Hi, All; Suppose I have a class 'dat' such that setClass('dat', representation

Re: [R] avoiding timconsuming for loop renaming identifiers

2007-07-20 Thread Benilton Carvalho
as.integer(factor(dta[[school_id]])) b On Jul 20, 2007, at 9:26 PM, [EMAIL PROTECTED] wrote: Hi All I was wondering if I can avoid a time-consuming for loop on my 60 obs dataset. school_id y 8 9.87 8 8.89 8 7.89 8 8.88 20 6.78

Re: [R] avoiding timconsuming for loop renaming identifiers

2007-07-20 Thread François Pinard
[EMAIL PROTECTED] I was wondering if I can avoid a time-consuming for loop on my 60 obs dataset. school_id y 8 9.87 8 8.89 8 7.89 8 8.88 20 6.78 20 9.99 20 8.79 31 10.1 31 11 There are, say, 143

[R] Robust PLS

2007-07-20 Thread Pedro Mardones
Dear all; Does anyone have written or know where to get a function for fitting robust partial least squares in R? Thanks for any ideas PM __ R-help@stat.math.ethz.ch mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting

Re: [R] Dataframe of factors transform speed?

2007-07-20 Thread Latchezar Dimitrov
Hi, Thanks for the help. My 1st question still unanswered though :-) Please see bellow -Original Message- From: Benilton Carvalho [mailto:[EMAIL PROTECTED] Sent: Friday, July 20, 2007 3:30 AM To: Latchezar Dimitrov Cc: r-help@stat.math.ethz.ch Subject: Re: [R] Dataframe of