Re: [R] Error with Source()

2011-11-13 Thread Mario Valle
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-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group

Re: [R] Win upgrade pb (virus)

2011-11-12 Thread Mario Valle
protection. Voilà, no more problems. Thanks again! mario On 11-Nov-11 11:34, Mario Valle wrote: I just upgraded my Win7 32bits installation to 2.14.0 after deinstalling 2.12.x First thing I moved the win-library from 2.12 to 2.14 and executed a update.packages(ask='graphi

[R] Win upgrade pb (virus)

2011-11-11 Thread Mario Valle
I had to remove the colorspace and ggplot2 packages. Is it a known problem? What else can I do (except removing the above packages or changing antivirus)? Thanks! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~m

Re: [R] How to add a double quote to a string

2011-10-11 Thread Mario Valle
r-help PLEASE do read the posting guide http://www.R-project.org/posting-guide.html and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Superc

Re: [R] For loop for subset - repeating same over and over?

2011-09-29 Thread Mario Valle
t;BWJBIG") n.SiteSpp<- length(SiteSpp) for (i in (1:n.SiteSpp)) { QInfl.aov<- aov(AvgOfnumResponse ~ strTrea*strYear, data=QInflAvgbyPlot, subset=(SiteSpp == SiteSpp[i])) print(summary(QInfl.aov)) } -- Ing. Mario Valle Data Analysis a

Re: [R] trouble with library(FEAR) and libgfortran.so.1

2011-09-24 Thread Mario Valle
d, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +41 (91) 610.82.82

Re: [R] Unexpected behavior from which.max (or possibly max)

2011-09-15 Thread Mario Valle
-guide.html and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switze

Re: [R] writeLines + foreach/doMC

2011-07-04 Thread Mario Valle
manni [[alternative HTML version deleted]] __ 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

[R] Can I disable Cairo?

2011-06-20 Thread Mario Valle
that are forced to load and use CairoDevice if they wants better quality. I want to avoid this, is it possible? Thanks! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS

Re: [R] EM vs Bayesian

2011-04-29 Thread Mario Valle
Baysian model when it comes to differentiating univariate mixture of normal distributions? -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928

Re: [R] Location of libraries in Windows

2011-04-18 Thread Mario Valle
! mario On 18-Apr-11 09:22, Mario Valle wrote: I'm preparing to install 2.13, so I need a clarification about package location on disk. On window the packages I have installed are under C:\Users\mvalle\R\win-library\2.12 and the ones that come with R are under "

[R] Location of libraries in Windows

2011-04-18 Thread Mario Valle
ld ask if moving all directories (except maybe base) from R\library to R\win-library\2.12 could be a "good thing to do". Or should I simply not update packages that come with R? Thanks for your help! mario -- Ing. Mario Valle Data An

Re: [R] Krylov subspace computations of matrix exponentials

2011-04-14 Thread Mario Valle
ssion message and copyright notice appear in all copies." If I choose to use Expokit and just write an interface to R, would there be any problems with having such a copyright notice in the package? Thanks, Niels -- Ing. Mario Valle Data Analysis and Visualization Group| http://w

Re: [R] Non linear Regression: "singular gradient matrix at initial parameter estimates"

2011-04-12 Thread Mario Valle
p4 * x)) -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +41 (91) 610.82.82 __

Re: [R] Optimzing a nested function

2011-04-12 Thread Mario Valle
ng-guide.html and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Sw

Re: [R] Very simple question

2011-04-08 Thread Mario Valle
paste(teste, collapse="+") ciao! mario On 08-Apr-11 12:44, Ronaldo Reis Junior wrote: teste <- c("A","B","C") -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Superc

Re: [R] hc2Newick is different than th hclust dendrogram

2011-04-04 Thread Mario Valle
ano wrote: It was... I have it in my sent box is called data.Rdata... I am attaching it again! Thanks -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galler

Re: [R] Plotting MDS (multidimensional scaling)

2011-04-02 Thread Mario Valle
x27;C','D'), cex=1) Best, Daniel -- View this message in context: http://r.789695.n4.nabble.com/Plotting-MDS-multidimensional-scaling-tp3422670p3422670.html Sent from the R help mailing list archive at Nabble.com. __ R-help@r-project

[R] How to put line linking two plots

2011-03-30 Thread Mario Valle
row = TRUE)) plot(runif(10), type='b') plot(runif(20), type='l') plot(runif(20), type='l') dev.off() R 2.12.2 on Windows 7 (32bits) -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre

Re: [R] Removing Bad Data

2011-03-16 Thread Mario Valle
73 -0.0065 09/30/2007 0.0197 0.0477 0.0410 0.0331 0.0114 0.0322 The "-" (first row, last column) is getting picked up from excel and is not a number How do I check for this and replace with zero [[alternative HTML version deleted]] -- Ing. Mar

Re: [R] Removing Bad Data

2011-03-16 Thread Mario Valle
062 -0.0138 -0.0173 -0.0065 09/30/2007 0.0197 0.0477 0.0410 0.0331 0.0114 0.0322 -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale

Re: [R] sprintf does not print

2011-02-16 Thread Mario Valle
to that strange problem? Best Regards Alex __ 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-contained, reproducible c

Re: [R] txtProgressBar examples?

2011-02-15 Thread Mario Valle
.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-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch

[R] Fwd: Re: [R-sig-hpc] Working doSNOW foreach openMPI example

2011-01-13 Thread Mario Valle
-...@r-project.org https://stat.ethz.ch/mailman/listinfo/r-sig-hpc -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +

Re: [R] Grid drawing over the filled.contour's legend

2011-01-13 Thread Mario Valle
mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +41 (91) 610.82.82 __

Re: [R] [R-sig-hpc] Error in makeMPIcluster(spec, ...): how to get a minimal example for parallel computing with doSNOW to run?

2010-12-16 Thread Mario Valle
Error in stopCluster(cl) : object 'cl' not found [1] "Please use mpi.close.Rslaves() to close slaves" [1] "Please use mpi.quit() to quit R" ## output ==== ___ R-sig-hpc mailing list r-sig-...@r-project.

Re: [R] Is there a way to have 'comment' keep a list?

2010-11-09 Thread Mario Valle
__ 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-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualizatio

[R] FYI: The First Cloud Portal to “R”

2010-10-27 Thread Mario Valle
html Enjoy! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +41 (91)

Re: [R] Artifacts in filled.contour+pdf

2010-10-26 Thread Mario Valle
have this problem in pdf viewers. HTH, baptiste On 26 October 2010 02:30, David Winsemius wrote: On Oct 25, 2010, at 6:50 AM, Mario Valle wrote: Dear all, I'm using R 2.12.0 on Windows 7 (32bits) I created a filled contour from the attached data using the following code: load('

Re: [R] Artifacts in filled.contour+pdf

2010-10-26 Thread Mario Valle
. mario On 26-Oct-10 02:30, David Winsemius wrote: On Oct 25, 2010, at 6:50 AM, Mario Valle wrote: Dear all, I'm using R 2.12.0 on Windows 7 (32bits) I created a filled contour from the attached data using the following code: load('bug.R

Re: [R] the function doesn´t work

2010-09-26 Thread Mario Valle
5) p<- (l^2)/sum(l^2) H[i]<- sum(p_0*log(p_0)) - sum(p * log(p)) } 1- mean(q_1<= H& H<= q_2) } m1=seq(0,n/2,len=10) k1=1/m1 output<- power(k1) f=outer(k1,Vectorize(power)) -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle S

Re: [R] the function doesn´t work

2010-09-26 Thread Mario Valle
.05) p<- (l^2)/sum(l^2) H[i]<- sum(p_0*log(p_0)) - sum(p * log(p)) } 1- mean(q_1<= H& H<= q_2) } m=seq(10,50,len=10) f=outer(p,m,Vectorize(power)) persp(p,m,power,theta=-50,phi=30,d=4,border="black") -- Ing. Mario Valle Data Analysis and Visualization Group|

Re: [R] help me understand how things work.

2010-09-16 Thread Mario Valle
s Alex *From:* Mario Valle *To:* Alaios *Sent:* Thu, September 16, 2010 1:28:31 PM *Subject:* Re: [R] help me understand how things work. ?dist BTW, to me this does not happens. x <- matrix(rnorm(100), nrow=5) d <- dist(x) 1/sqrt(d) 1/sqrt(dist(x)) H

Re: [R] LOOping problem with R

2010-08-29 Thread Mario Valle
; > [[alternative HTML version deleted]] > > __ > 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

[R] FYI: matrix surprise

2010-07-13 Thread Mario Valle
ot work. Same values in both columns y[s$idx, s$prefix] <- s$val print(y) ### This works as expected for(i in 1:4) y[s$idx[i], s$prefix[i]] <- s$val[i] print(y) ### And also this y[s$idx[c(1,2)], "A"] <- s$val[c(1,2)] y[s$idx[c(3,4)], "B"] <- s$val[c(3,4)] print(y

Re: [R] Parallel computing on Windows (foreach)

2010-06-16 Thread Mario Valle
uting work. Please, help. Regards, Sergey __ 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-contained, reproducible cod

Re: [R] drawing curve

2010-06-10 Thread Mario Valle
_ 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-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group|

Re: [R] Merge usage to update data.frame

2010-06-06 Thread Mario Valle
3 On Sun, Jun 6, 2010 at 12:41 PM, Mario Valle wrote: Good morning! I have two datasets with the same structure, one containing all my values and the second one that update same of these values (see example below). I want to create a data.frame with all the values of the first dataset exc

[R] Merge usage to update data.frame

2010-06-06 Thread Mario Valle
22") u <- read.table(t2, stringsAsFactors=FALSE) close(t2) m <- merge(a, u, by="V1", all.x=TRUE) out <- data.frame(V1=m$V1, V2=ifelse(is.na(m$V2.y), m$V2.x, m$V2.y)) -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss Nation

Re: [R] AM/PM strptime %p failing 2.11.0 WinXP

2010-05-23 Thread Mario Valle
n/listinfo/r-help PLEASE do read the posting guide http://www.R-project.org/posting-guide.html and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomput

Re: [R] apparent problems with the textConnection command

2010-05-19 Thread Mario Valle
ey are just my attempts to understand the R > language better. > Thanking you, > Ravi > > __ > 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.or

Re: [R] Fitting a function

2010-05-14 Thread Mario Valle
lp PLEASE do read the posting guide http://www.R-project.org/posting-guide.html and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel

Re: [R] sprintf funny behavior

2010-05-11 Thread Mario Valle
-project.org/posting-guide.html > and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 692

Re: [R] How to make legend with line+ character

2010-04-26 Thread Mario Valle
='b', lwd=2,pch='a') text(1.4,6, label="-a- ", col="red") text(2.5,6, label="dg1") --- On Mon, 4/26/10, Mario Valle wrote: From: Mario Valle Subject: [R] How to make legend with line+ character To: "r-help@r-project.org" Received: Monda

Re: [R] How to make legend with line+ character

2010-04-26 Thread Mario Valle
Thanks Uwe and Henrique! Both solution works and both have the same niceness/work.required ratio :-) Thanks again! mario On 26-Apr-10 14:02, Uwe Ligges wrote: On 26.04.2010 13:32, Mario Valle wrote: Dear all, I have a multiline plot with each line labeled with a

[R] How to make legend with line+ character

2010-04-26 Thread Mario Valle
es nothing with letters. Any idea? plot(1:10,10:1,lty=1,type='b', lwd=2,pch='a') legend("left", legend=c("ds1","ds2"), bty='n', col=1:2, lty=2,lwd=4,pch=letters) Thanks for your help! mario -

Re: [R] macro variable in R?

2010-04-22 Thread Mario Valle
. Anyone have any suggestions? thanks, karena -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +41

[R] Unexpected warning from matplot

2010-04-21 Thread Mario Valle
pch involved? Annoyance or feature? The fix (if needed) is simple. In the matplot code change: if (is.null(pch)) { to: if (is.null(pch) & (type[1] %in% c('p','b','o'))) { Best regards mario P.S.: R 2.9 on Win and Linux -- Ing. Mario Valle

Re: [R] Confusing concept of vector and matrix in R

2010-03-30 Thread Mario Valle
_ > 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-contained, reproducible code. -- Ing. Mario Valle Data Anal

Re: [R] printing text within if functions inside a for loop

2010-03-23 Thread Mario Valle
runs fine and the sprintf function runs fine on its own, but the > problem I am having is that there is no output if I run the loop with the > sprintf inside it. Does anyone know what could be wrong? Is there a way for > the code to output data within this loop? I can't seem to

Re: [R] Creating images without X11

2010-03-14 Thread Mario Valle
tal Resources Engineering Humboldt State University -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +41 (91) 610.82

Re: [R] looking for a package to solve current-voltage equation I=f(I)

2010-03-12 Thread Mario Valle
nabble.com/file/n1590462/iv.png which is one current-voltage equation of a solar cell. Thanks in advance, Ptit Bleu. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.

Re: [R] IMPORTANT - To remove the null elements from a vector

2010-03-09 Thread Mario Valle
ned, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax: +41 (91) 610.82

Re: [R] How to create a SVG plot

2010-03-04 Thread Mario Valle
library(cairoDevice) Cairo_svg() On 04-Mar-10 8:13, Lesong Tsai wrote: Hi! I want to know how to create a SVG plot with R. savePlot() can't make it . waiting for your answer. thank you . -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~m

Re: [R] Output to sequentially numbered files... also, ideas for running R on Xgrid

2010-03-02 Thread Mario Valle
of i the function is running for. But I get the error: 'file' must be a character string or connection Is there a way of writing out to a csv file numbered with the value of a variable? Also, is this a very complicated way of parallelising this function? Many thanks, Joe -- Ing.

Re: [R] two questions for R beginners

2010-02-26 Thread Mario Valle
; The "why-does-this-not-print" FAQ. >> >> Why does par(oma..) not work with lattice? >> >> Dieter >> >> >> > > __ > R-help@r-project.org mailing list > https://stat.ethz.ch/mailman/listinfo/

Re: [R] multicore in R

2010-02-25 Thread Mario Valle
the result by: result$`processID(zz)`$par but it return NULL. so any idea how to get the result? with best regards, -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cant

[R] Where can I find general help on statistics?

2010-02-23 Thread Mario Valle
Could you suggest where I could post general statistical/data analysis questions? For now I have found: http://talkstats.com/ and http://www.statisticsforums.com/ Thanks! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss

Re: [R] strange behaviour of median

2010-02-04 Thread Mario Valle
gards > > Petr > > __ > 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] Problems with fitdistr

2010-01-28 Thread Mario Valle
ollows:- > Error in optim(x = c(4L, 41L, 20L, 6L, 12L, 6L, 7L, 13L, 2L, 8L, 22L, > : > non-finite value supplied by optim > Any help or suggestions are most welcomed -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss Na

Re: [R] Mutliple sets of data in one dataset....Need a loop?

2010-01-22 Thread Mario Valle
; #Now you can use lapply() to carry out the same operation on > #each component of your list. For example, to send plots to > #a pdf with 1 page for each component: > > pdf("plot.pdf") > lapply(df.lst,function(df)plot(df[,2],df[,3])) > dev.off() > > > >

Re: [R] question on plot in R with mac

2010-01-20 Thread Mario Valle
ailman/listinfo/r-help PLEASE do read the posting guide http://www.R-project.org/posting-guide.html and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre

Re: [R] density() vs. KernSmooth::bkde

2010-01-18 Thread Mario Valle
, Mario Valle wrote: Any advice when to use denstity() and when the KernSmooth package bkde() to smooth a histogram? No specific problem to use either one, but I'm curious why there are two so similar implementations. They are fundamentally different. density() uses FFT: bkde() does not a

[R] density() vs. KernSmooth::bkde

2010-01-18 Thread Mario Valle
Any advice when to use denstity() and when the KernSmooth package bkde() to smooth a histogram? No specific problem to use either one, but I'm curious why there are two so similar implementations. Thanks! mario -- Ing. Mario Valle Data Analysis and Visualization

[R] optim: abnormal termination in lnsrch (resend)

2010-01-12 Thread Mario Valle
optim() changes anything? Thanks for your help! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland

[R] optim: abnormal termination in lnsrch (resend)

2010-01-12 Thread Mario Valle
unction to make the minimization succeed? Do you think using BBoptim() instead of optim() changes anything? Thanks for your help! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (C

[R] optim: abnormal termination in lnsrch

2010-01-12 Thread Mario Valle
anges anything? Thanks for your help! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Switzerland | Fax:

Re: [R] Distance between sets of points in transformed environmental space

2009-12-01 Thread Mario Valle
sum of the +'s, however there > might need to be some scaling to take into account the number of > points in each set. > > There are also a lot of fancy things out there, so someone will > probably come up with a much fancier (and possibly better) idea than > this. > > W

Re: [R] Learning R - View datasets

2009-11-27 Thread Mario Valle
d, reproducible code. > > ______ > 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 comm

Re: [R] making R print on screen

2009-09-24 Thread Mario Valle
> > Thanks a lot! > > for(i in ) { > x<-... > print(x) > } > > > -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.

[R] (correction) snowfall+Rmpi: sfExport error

2009-09-22 Thread Mario Valle
quot;MPI") for(i in 1:9) { n <- 2 logx <- runif(n, 0.02, 0.54) sfExport("logx") } sfStop() -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610

[R] snowfall: sfExport apparently harmless error

2009-09-22 Thread Mario Valle
uot;) # Compute fake function computeTakens <- function(r0idx) { if(r0idx == 1) return(NA) return(1/(logx[r0idx] - sum(logx[1:(r0idx-1)])/(r0idx-1))) } res <- sfClusterApplyLB(n:1, computeTakens) } sfStop() -- Ing. Mario Valle Data Analysis and Visualization Group

[R] snowfall: missing MPI node

2009-09-22 Thread Mario Valle
from the -mp argument. In any case, is it possible to know in the script the number of processes (-np #) requested to mpirun? Thanks for your time! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle

Re: [R] Running two R instances at the same time

2009-09-05 Thread Mario Valle
__ 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-contained, reproducible code. -- Ing. Mario Val

Re: [R] Submit a R job to a server

2009-08-27 Thread Mario Valle
gt; Bernd > > __ > 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-contained, repro

Re: [R] Subsample points for mclust

2009-07-21 Thread Mario Valle
dataset (downsampled to 1/10) it suggests 9 Gaussian, but the central 7 sum with good approximation to a single Gaussian, so the dataset is better decomposed into only 3 Gaussian. I admit I'm not rigorous at all... Bye! mario Mario Valle wrote: Hi all! I have an or

[R] Subsample points for mclust

2009-07-21 Thread Mario Valle
thank for your help! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Ga

[R] Wiki down?

2009-07-03 Thread Mario Valle
>From yesterday I cannot connect anymore to wiki.r-project.org Is the problem known? Thanks! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.6

[R] FBI Homicide data?

2009-06-12 Thread Mario Valle
2_itemId=6016 Thanks for your help! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928 Manno, Swi

Re: [R] Issues getting R to write image files

2009-06-11 Thread Mario Valle
rom the command line, but does have the Xlibrarys and can clearly write tiff's as it managed it with the filled contours. Bear in mind I only started with both linux and R a couple of days ago, so be gentle if it is something silly! Cheers, Kenny -- Ing. Mario Valle Data Analysis an

Re: [R] How to read a binary file bit by bit?

2009-05-29 Thread Mario Valle
http://www.R-project.org/posting-guide.html and provide commented, minimal, self-contained, reproducible code. -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v

[R] How could I terminate a script (without leaving R)?

2009-05-28 Thread Mario Valle
# script end Using stop("No file found", call.=F) works, but the Error message is ugly in this case. Any suggestion? Thanks for your help! mario -- Ing. Mario Valle Data Analysis and Visualization Group| http://www.cscs.ch/~mvalle Swiss National Su