[R] Bias in sample - Logistic Regression

2008-09-30 Thread Maithili Shiva
Hi. This is my first mail. I am new to R and also to the company where I am employed now. I have Statistics background (i.e. Master of Science). However, it is only now I understand what I learned in text is simply a bookish knowledge and when it comes to actually applying statistics in real li

[R] (no subject)

2008-09-30 Thread Maithili Shiva
Hi. This is my first mail. I am new to R and also to the company where I am employed now. I have Statistics background (i.e. Master of Science). However, it is only now I understand what I learned in text is simply a bookish knowledge and when it comes to actually applying statistics in real li

[R] Help with CrossTable

2008-09-30 Thread Ravi S. Shankar
Hi, I am using the CrossTable function from library(gmodels). x=unique(data[,c("L1","L1_Revenues","RIC")]) L1_Classification=CrossTable(x$L1,x$L1_Revenues,exclude = c("NA","","0%","0"),prop.r=FALSE,prop.c=FALSE,prop.t=FALSE,prop.chisq=FA LSE,dnn=c("L1_Classification","Revenue")) What I

[R] goodness of fit test

2008-09-30 Thread Edna Bell
Dear R Gurus; Is there an automated process for goodness of fit tests, please? I know there is prop.test for one at a time, but I was wondering about this, please. Thanks, Edna Bell __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/lis

[R] regexpr syntax question

2008-09-30 Thread zack holden
Greetings R list, I am stuck on a simple syntax problem. I want to list all files in a directory, excluding files of a certain type. I have tried pattern matching as follows: a <- list.files(data, full.name = TRUE, pattern != ".xml") # exclude all .xml files The warning returns that

Re: [R] plot inside graphic area

2008-09-30 Thread Greg Snow
Look at the subplot function in the TeachingDemos package. -Original Message- From: "José Alberto Monteiro" <[EMAIL PROTECTED]> To: "[EMAIL PROTECTED]" <[EMAIL PROTECTED]> Sent: 9/30/08 4:33 PM Subject: [R] plot inside graphic area I am trying to plot a small graphic inside the graphic a

Re: [R] Weibull distribution

2008-09-30 Thread David Winsemius
Doing a search on: weibull and "probability plot" along with... r-help in Google produced this reply which I think gives a worked example that fits some of your hopes. http://tolstoy.newcastle.edu.au/R/help/03b/1714.html I am not sure what the B's are however. If they are quantiles. I

Re: [R] Logistic regression problem

2008-09-30 Thread Frank E Harrell Jr
Bernardo Rangel Tura wrote: Em Sáb, 2008-09-27 às 10:51 -0700, milicic.marko escreveu: I have a huge data set with thousands of variable and one binary variable. I know that most of the variables are correlated and are not good predictors... but... It is very hard to start modeling with such a

Re: [R] Dealing With Extremely Large Files

2008-09-30 Thread Gabor Grothendieck
There are no built in facilties for fixed column widths but its not hard to parse out the fields yourself using the sqlite substr function. I've added example 6f to the sqldf home page which illustrates this. http://sqldf.googlecode.com On Tue, Sep 30, 2008 at 5:18 PM, zerfetzen <[EMAIL PROTECTE

Re: [R] plot inside graphic area

2008-09-30 Thread Henrique Dallazuanna
See fig argument in par function. On Tue, Sep 30, 2008 at 3:38 PM, José Alberto Monteiro <[EMAIL PROTECTED]> wrote: > I am trying to plot a small graphic inside the graphic area of a bigger > graphic. Does anybody know the commend for that? > Thanks a lot! > > -- > MSc JosÃ(c) Alberto F. Monteiro

Re: [R] conditional loop

2008-09-30 Thread jim holtman
It looks like you are test against TAZDetermine before it is defined. Try something like this: while(TRUE){ ...generate random number if (value > Dev_size) break } On Tue, Sep 30, 2008 at 6:56 PM, PDXRugger <[EMAIL PROTECTED]> wrote: > > I am looking up a number based upon a randomly sele

[R] conditional loop

2008-09-30 Thread PDXRugger
I am looking up a number based upon a randomly selected number and then proceed to the rest of my code if the corresponding value is greater than or equal to yet another value. so if Dev_Size = 14 and my randomly selected number is 102 and i am looking up 102 in the following table 100 21

Re: [R] Quantile Regression for Longitudinal Data. Warning message: In rq.fit.sfn

2008-09-30 Thread roger koenker
This is a little esoteric for R-help. As the posting guide says, you should write the package maintainer with this sort of question. Without the data it is difficult to judge what is happening, a couple of possibilities are: o all is well and warning just conveys an exaggerated s

[R] integrate: can pass numbers but not variables as additional arguments

2008-09-30 Thread Sasha Pustota
I'm trying to integrate one dimension of a bivariate normal. It works when additional parameters are passed explicitly: library(mvtnorm) bivInt <- function(x,y,mx,my,r) { dmvnorm(c(x, y), mean=c(mx, my), sigma=rbind(c(1, r), c(r, 1))) } integrate(Vectorize(bivInt), lower=-Inf, upper=2, 1, 2, 2, .5

Re: [R] Adding legends to a plot

2008-09-30 Thread Jorge Ivan Velez
Dear Julia, Try this: plot(1:10) legend("topleft", legend=c("g1", "g2", "g3"), col=c('black','red','blue'), lty=1,lwd=1.5) # or plot(1:10) legend("topleft", legend=c("g1", "g2", "g3"), text.col=c('black','red','blue'),ncol=3) HTH, Jorge On Tue, Sep 30, 2008 at 3:03 PM, liujb <[EMAIL PROTECT

Re: [R] Logistic regression problem

2008-09-30 Thread Jason Jones Medical Informatics
So...I wouldn't suggest the trying all possible logistic models approach either and I'm not sure exactly what your goals are in modeling. However, I've been fiddling around with the variable importance (varimp) functions that come with the randomForest and party packages. The idea is to get an

Re: [R] Dealing With Extremely Large Files

2008-09-30 Thread zerfetzen
Thank you Gabor, this is fantastic, easy to use and so powerful. I was instantly able to many things with .csv files that are much too large for my PC's memory. This is clearly my new favorite way to read in data, I love it! Is it possible to use sqldf with a fixed width format that requires a

[R] Adding legends to a plot

2008-09-30 Thread liujb
Hello, I have a time series plot drawn using 3 different colored lines, each line corresponds to different category group. I'd like to put legends on the plot. I am using "legend" to do this, however, I can either specify lty or col in legend. Will I be able to do the following in the legend box:

Re: [R] ggplot 2 - editing in the "panel_1_1" viewport

2008-09-30 Thread Paul Murrell
Hi Pedro Barros wrote: > Hi All, > > I am trying to find out how to access the components of a ggplot plot, and I > found this reply from Paul Murrel > http://www.nabble.com/navigating-ggplot-viewports-tt14826352.html#a15056223. > I tried it, and it works. > However, I am trying to develop some

[R] Quantile Regression for Longitudinal Data. Warning message: In rq.fit.sfn

2008-09-30 Thread dimitris kapetanakis
Hi, I am trying to estimate a quantile regression using panel data. I am trying to use the model that is described in Dr. Koenker's article. So I use the code the that is posted in the following link: http://www.econ.uiuc.edu/~roger/research/panel/rq.fit.panel.R While this code run perfectly, i

[R] plot inside graphic area

2008-09-30 Thread José Alberto Monteiro
I am trying to plot a small graphic inside the graphic area of a bigger graphic. Does anybody know the commend for that? Thanks a lot! -- MSc José Alberto F. Monteiro Botanisches Institut Universität Basel السلام عليكم [[alternative HTML version deleted]] _

Re: [R] count data with a specific range

2008-09-30 Thread sandsky
I am converting exact time data to interval data and generate samples via Bootstraping. I had a quite long code to get the frequency but your help makes it simpler. Thank you.. jholtman wrote: > >> data<-c(2,6,13,26,19,25,18,11,22,25) >> table(cut(data, breaks=c(0,10,20,30))) > > (0,10] (10,

Re: [R] R's integrate function

2008-09-30 Thread Charles C. Berry
On Tue, 30 Sep 2008, Susanne Pfeifer wrote: Hi, sorry, I was a bit confused and my function looked slightly different from the one I posted before: In any case, you will not get far trying to integrate this one for values of z like 12000 without doing some homework. Simply plugging the func

Re: [R] Logistic regression problem

2008-09-30 Thread Bernardo Rangel Tura
Em Sáb, 2008-09-27 às 10:51 -0700, milicic.marko escreveu: > I have a huge data set with thousands of variable and one binary > variable. I know that most of the variables are correlated and are not > good predictors... but... > > It is very hard to start modeling with such a huge dataset. What wo

[R] adding planes/lines to 3d surface plots? (persp, wireframe)

2008-09-30 Thread Sam Yeaman
Dear helplist members, I have been using 'wireframe()' to make 3d plots using the following call: wireframe (temp ~ xc2 * mc2, screen = list(z = 230, x = -70, y = 0), scales = list (arrows = FALSE)) and these three vectors: xc2 mc2temp [1,] 0.1 0.04 0.049797615 [2,] 0.2 0.0

[R] merging a list and data frame

2008-09-30 Thread eric lee
Hi, I'd like to merge the following list and data frame by matching the first column in the data frame to the first number in each object of the list. I'd also like the merged object to be a list. Any suggestions? Thanks. eric a <- list(c(1,11), c(2,12), c(3,13), c(4,14), c(5,16)) b <- data.f

Re: [R] Logistic regression problem

2008-09-30 Thread Frank E Harrell Jr
Milicic B. Marko wrote: The only solution I can see is fitting all possib le 2 factor models enabling interactions and then assessing if interaction term is significant... any more ideas? Please don't suggest such a thing unless you do simulations to back up its predictive performance, type

Re: [R] Programming Workshops

2008-09-30 Thread Duncan Murdoch
On 9/30/2008 1:02 PM, Darin Brooks wrote: Good morning Does R (or R users) have a formal training workshop/facility? Or do open-source softwares generally put the onus on the user to learn programming techniques? Are the workshops generally offered for the masses or is there one-on-one tr

Re: [R] R's integrate function

2008-09-30 Thread Susanne Pfeifer
Hi, sorry, I was a bit confused and my function looked slightly different from the one I posted before: Susanne Pfeifer schrieb: >>> integrate(function(y,z){ >> + sapply(y, function(y,z){ >> + integrate(function(x,z) >> + >> 1/x*dbeta(0.01,x/(0.005/1.005),(1-x)/(0.005/1.005))*dbeta(y,

Re: [R] problem loading WordNet into R

2008-09-30 Thread Bob Green
Hello Martin, Many thanks for your reply. I tried the command you suggested, which generated version (A) below. In response - I inserted back "-" and "dict" (which I had previously tried and removed, in one of the multitude of variations I have tried) and added \\. This still produced the e

Re: [R] R's integrate function

2008-09-30 Thread Susanne Pfeifer
Hi Charles, hi Victor Charles C. Berry schrieb: > What verson of R? > > Works for me: > >> integrate(function(y,z){ > + sapply(y, function(y,z){ > + integrate(function(x,z) > + > 1/x*dbeta(0.01,x/(0.005/1.005),(1-x)/(0.005/1.005))*dbeta(y,x/(0.005/1.005),(1-x)/(0.005/1.005))*(1-y)^z,

Re: [R] Programming Workshops

2008-09-30 Thread John Kane
No but there are various groups/organizations/??? who from time to time offer courses sometimes presented by R experts and R Core developers or package developers . A search of the R-help archives should bring up some of these. RSiteSearch("course") will bring up some examples that may h

[R] fft inverse display help

2008-09-30 Thread rkevinburton
I have a a simple function that generates a time series square wave: genseq <- function() { x <- numeric(4*365) s <- seq(as.Date("2005-01-01"), as.Date("2008-12-31"), by="month") ob <- as.vector(s[c(10,22,34,46)] - as.Date("2005-01-01")) oe <- as.vector(s[c(11,23,35,47)] - as.Date("2005-01

Re: [R] Logistic regression problem

2008-09-30 Thread Milicic B. Marko
The only solution I can see is fitting all possib le 2 factor models enabling interactions and then assessing if interaction term is significant... any more ideas? Milicic B. Marko wrote: > > I have a huge data set with thousands of variable and one binary > variable. I know that most of th

Re: [R] R's integrate function

2008-09-30 Thread Victor Hernando Cervantes Botero
I got the same error. > sessionInfo() R version 2.6.0 (2007-10-03) i386-pc-mingw32 locale: LC_COLLATE=Spanish_Colombia.1252;LC_CTYPE=Spanish_Colombia.1252;LC_MONETARY=Spanish_Colombia.1252;LC_NUMERIC=C;LC_TIME=Spanish_Colombia.1252 attached base packages: [1] stats graphics grDevices utils

[R] error in fBasics package

2008-09-30 Thread Megh Dal
When I try to load "fBasics" package, I get following error/warning : > library(fBasics) Loading required package: fImport Loading required package: fSeries Loading required package: fBasics Loading required package: fImport Loading required package: fSeries Loading required package: fBasics Loadi

Re: [R] Desperatly seeking Parallel R simulation with Windows XP

2008-09-30 Thread Erin Hodgess
It works under Windows,too! You can also use cl <- makeCluster(2,type="SOCK") Thanks, Erin PS I have a dual core machine. On Tue, Sep 30, 2008 at 3:55 AM, Rainer M Krug <[EMAIL PROTECTED]> wrote: > On Tue, Sep 30, 2008 at 10:18 AM, quant15 > <[EMAIL PROTECTED]> wrote: >> >> Hello R experts, >>

Re: [R] R's integrate function

2008-09-30 Thread Charles C. Berry
What verson of R? Works for me: integrate(function(y,z){ + sapply(y, function(y,z){ + integrate(function(x,z) + 1/x*dbeta(0.01,x/(0.005/1.005),(1-x)/(0.005/1.005))*dbeta(y,x/(0.005/1.005),(1-x)/(0.005/1.005))*(1-y)^z,0,1 + ,423)$value + }) + },0,1,423) 18.9513 with abs

[R] Programming Workshops

2008-09-30 Thread Darin Brooks
Good morning Does R (or R users) have a formal training workshop/facility? Or do open-source softwares generally put the onus on the user to learn programming techniques? Are the workshops generally offered for the masses or is there one-on-one training available? Does one "go to" R for

[R] Planned mailing list "timeout" of several hours

2008-09-30 Thread Martin Maechler
There will be upcoming maintenance work on one of main network's server which will affect the MAIL server for all mailing lists [EMAIL PROTECTED] (or [EMAIL PROTECTED]). This change will take place on Wednesday October 1, from 9 p.m. (UTC+2) 3 p.m. (US East) ..

[R] R's integrate function

2008-09-30 Thread Susanne Pfeifer
Hello, I am trying to use R's integrate function to calculate the following integral for z=423: integrate(function(y,z){ sapply(y, function(y,z){ integrate(function(x,z) 1/x*dbeta(0.01,x/(0.005/1.005),(1-x)/(0.005/1.005))*dbeta(y,x/(0.005/1.005),(1-x)/(0.005/1.005))*(1-y)^z,0,1,423)$value }) },0,

[R] R's integrate function

2008-09-30 Thread Susanne Pfeifer
Hello, I am trying to use R's integrate function to calculate the following integral for z=423: integrate(function(y,z){ sapply(y, function(y,z){ integrate(function(x,z) 1/x*dbeta(0.01,x/(0.005/1.005),(1-x)/(0.005/1.005))*dbeta(y,x/(0.005/1.005),(1-x)/(0.005/1.005))*(1-y)^z,0,1,423)$value }) },0,

[R] Courses*** R+/Splus (1) Fundamentals - (2) Advanced Programming : October 2008 at 3 locations by XLSolutions Corp

2008-09-30 Thread [EMAIL PROTECTED]
XLSolutions Corporation (www.xlsolutions-corp.com) is proud to announce our*** R+/Splus ***courses at 3 USA locations for October 2008. (1) R+/Splus Fundamentals and Programming Techniques http://www.xlsolutions-corp.com/rplus.asp * San Francisco ** October 23-24, 2008

Re: [R] Pattern match in R

2008-09-30 Thread Gabor Grothendieck
Try this where ? signifies that the prior character is optional: dir(pattern = "^Coverage_[1-9]?[0-9]$") On Tue, Sep 30, 2008 at 10:36 AM, bioinformatics_guy <[EMAIL PROTECTED]> wrote: > > I want to make sure this piece of code I wrote is doing what I want it to do. > > ll<-function(string) > {

Re: [R] Pattern match in R

2008-09-30 Thread Ted Harding
On 30-Sep-08 14:36:04, bioinformatics_guy wrote: > I want to make sure this piece of code I wrote is doing what > I want it to do. > > ll<-function(string) > { > grep(string,dir(),value=T) > } > > subdir = ll("Coverage_[1-9][0-9]$") > > I basically wrote a little function that would grab a

Re: [R] Using sub to get captions in barplots

2008-09-30 Thread Richard . Cotton
> I've been using "sub" (subtitle) instead of "main" such that captions are > below figures produced by xyplot. This works fine and captions are on a > single line. However, when I try this for bar plots with error bars > (altering the error.bars function form Crawley's The R Book, see below),

[R] Univariate kernel density estimation with boundary correction

2008-09-30 Thread Ying-Chao Hung
Hi, Does anyone know which packages in R can deal with "univariate kernel density estimation with boundary correction" ? Thanks a lot. Ying-Chao Hung __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the p

[R] Root-Mean-Square(RMS) Difference

2008-09-30 Thread Yogesh Tiwari
Dear R users, I am comparing two data sets (CO2 observation vs. CO2 simulation, during 1993-2002). In order to do it I am calculating Root-Mean-Square(RMS) difference with following formula: > sqrt(sum((observed_residual - simulated_residual)^2)/n) # 'n' is number of observations Residuals are co

Re: [R] multiple plots - editing ggplot2 plot

2008-09-30 Thread Pedro Barros
Hi Hadley, Thanks for the quick reply. Well, if I could do it directly in ggplot, even better. My data is below (from "dump"). I calculate the bar heights previously, now I just want to plot them, with fixed fill colours (to make sure they match other plots I use). Thanks again, Pedro `x1` <- st

Re: [R] Pattern match in R

2008-09-30 Thread Richard . Cotton
> I want to make sure this piece of code I wrote is doing what I want it to do. > > ll<-function(string) > { >grep(string,dir(),value=T) > } > > > subdir = ll("Coverage_[1-9][0-9]$") > > I basically wrote a little function that would grab all the files of form > Coverage_[0-99] > > The w

[R] simulate data from multinomial distribution with overdispersion

2008-09-30 Thread Ralph Scherer
Dear list members, I am searching for a way to simulate data from a multinomial distribution with overdispersion. The data should describe counts of different species under different conditions. Does someone know a way to simulate this or a book or article where I can find informations about t

[R] Using sub to get captions in barplots

2008-09-30 Thread David Afshartous
All, I've been using "sub" (subtitle) instead of "main" such that captions are below figures produced by xyplot. This works fine and captions are on a single line. However, when I try this for bar plots with error bars (altering the error.bars function form Crawley's The R Book, see below), the

[R] [R-pkgs] New package: plyr

2008-09-30 Thread hadley wickham
plyr is a set of tools that solves a common set of problems: you need to break a big problem down into manageable pieces, operate on each pieces and then put all the pieces back together. It's already possible to do this with split and the apply functions, but plyr just makes it all a bit easier w

Re: [R] ggplot 2 - editing in the "panel_1_1" viewport

2008-09-30 Thread hadley wickham
> I want to divide up the text grobs for the key labels into two > different (text) grobs (each) and put them back into the space occupied > by the original text grob. I've worked with grobs enough to think this > should be easy, but I just cannot figure out how to identify the > specific text grob

[R] Pattern match in R

2008-09-30 Thread bioinformatics_guy
I want to make sure this piece of code I wrote is doing what I want it to do. ll<-function(string) { grep(string,dir(),value=T) } subdir = ll("Coverage_[1-9][0-9]$") I basically wrote a little function that would grab all the files of form Coverage_[0-99] The way I wrote it, will it g

Re: [R] ggplot, getting two scales and one stat.

2008-09-30 Thread hadley wickham
Hi Tylere, This is a bug present in R 2.7.2 which will be fixed in the next version (which I'm trying to release ASAP) Hadley On Sat, Sep 27, 2008 at 4:21 PM, Tylere Couture <[EMAIL PROTECTED]> wrote: > Thanks Hadley, unfortunately doing this gives me an error: > >> ggplot(polls, aes(x =Date, y

Re: [R] multiple plots - editing ggplot2 plot

2008-09-30 Thread hadley wickham
On Sat, Sep 27, 2008 at 10:20 AM, Pedro Barros <[EMAIL PROTECTED]> wrote: > > Hi All, > > I am trying to build a composite plot, with multiple categories, using > ggplot2. > > In principle, it could be done using facetting, but I do not seem to be able > to get past the defaults, so I try building

Re: [R] CLARA and determining the right number of clusters

2008-09-30 Thread Christian Hennig
Hi there, I've tried your suggestion and it seems promising. But I have a couple of questions. I am reading a three column ASCII file (lon, lat, sst) mydata <- read.table("INFILE", header=FALSE,sep="", na.strings="99.00",dec=".",strip.white=TRUE,col.names=c("lon","lat","sst")) then I extract

Re: [R] CLARA and determining the right number of clusters

2008-09-30 Thread pacomet
Hi Christian and thanks I've tried your suggestion and it seems promising. But I have a couple of questions. I am reading a three column ASCII file (lon, lat, sst) > mydata <- read.table("INFILE", header=FALSE,sep="", na.strings="99.00",dec=".",strip.white=TRUE,col.names=c("lon","lat","sst")) th

[R] Hazard curves

2008-09-30 Thread Terry Therneau
-- begin included message - I am looking at a continuous variable, age. I am looking at time to 12-month remission and can calculate the HR and 95% confidence interval are follows: coxfita = coxph(Surv(rem.Remtime,rem.Rcens)~nearma$all.age,data=nearma) exp(coxfita$coefficients) exp(confint(cox

Re: [R] CLARA and determining the right number of clusters

2008-09-30 Thread Christian Hennig
Hi there, generally finding the right number of clusters is a difficult problem and depends heavily on the cluster concept needed for the particular application. No outcome of any automatic mathod should be taken for granted. Having said that, I guess that something like the example given in

[R] CLARA and determining the right number of clusters

2008-09-30 Thread pacomet
Hi everyone I have a question about clustering. I've managed using CLARA to get a clustering analysis of a large data set. But now I want to find which is the right number of clusters. The clara.object gives some information like the ratio between maximal and minimal dissimilarity that says (mayb

Re: [R] example - export a data frame to an XML file

2008-09-30 Thread zubin
Yes! This is perfect, Paul - thank you very much. -zubin Paul Murrell wrote: > Hi > > Is this what you are after ... ? > > > data <- > read.csv(textConnection('"date","UYG.Open","UYG.High","UYG.Low","UYG.Close","UYG.Volume","UYG.Adjusted" > "2007-02-01",71.32,71.34,71.32,71.34,200,69.23 > "2007-

[R] problem loading WordNet into R

2008-09-30 Thread Bob Green
Hello, I am hoping someone can assist me with a problem I have trying to load the WordNet dictionary into R. Below is the error message I receive: > library(wordnet) > initDict() [1] FALSE Warning message: In initDict() : cannot find WordNet 'dict' directory: please set the environment variab

Re: [R] Weibull distribution

2008-09-30 Thread Hoeks, Luis
Hello r-project team, I am new (test) user of R and I need some help. Sorry to wrote in German before, I am just a newbee to this mailing list. I would like to calculate and plot a Weibull distribution (Weibull best-fit line, accuracy curves left and right beside the best-fit line) for a simple

[R] Inverse of placeGrob?

2008-09-30 Thread Pedro Barros
Hi, I am trying to extract grobs from a frame. I found out how to place grobs in a frame, but not how to extract them once they are there. Is there an "inverse" function to placeGrob? Thanks, Pedro -- View this message in context: http://www.nabble.com/Inverse-of-placeGrob--tp19739738p19739738

Re: [R] birthday problem (factorial limit)

2008-09-30 Thread Bernardo Rangel Tura
Em Dom, 2008-09-28 às 19:43 +0200, Jörg Groß escreveu: > Hi, > > I tried to calculate the formula for the birthday problem > (the probability that at least two people out of a group of n people > share the same birthday) > > But the factorial-function allows me only to calculate factorials up

[R] ordering problem

2008-09-30 Thread Jose Luis Aznarte M.
Hi there! I need some assistance here with vector orderings. I have a set of q vectors of length p, grouped by rows in a matrix A, q·p, that I need to order lexicographically (http://en.wikipedia.org/wiki/Lexicographical_order). I also have another matrix B, p·r, and a vect

Re: [R] Version 2.7.2 GUI acts awkward?

2008-09-30 Thread Duncan Murdoch
Gregor Rolshausen wrote: hi, I am running R 2.7.2 Windows - recently the GUI-windows (for example to "change directory" or "read in R-scripts") do not open - well, they open, but close down directly afterwards. I can't select a directory or file ... I tried re-installing R - same problem aga

Re: [R] prblems changing directory in mpi snow clusters

2008-09-30 Thread tolga . i . uzuner
Please ignore, my fault, I was placing the clusterCall incorrectly. Should simply be > clusterCall(cl,setwd,"C:/") Regards, Tolga Tolga I Uzuner/JPMCHASE 30/09/2008 11:11 To r-help@r-project.org cc Subject prblems changing directory in mpi snow clusters Dear R Users, I am attemptin

Re: [R] R-2.7.2 infected?

2008-09-30 Thread Duncan Murdoch
Dave DeBarr wrote: For what it's worth, Computer Associates updated their signatures; and eTrust no longer reports the installation program for the Windows version of R-2.7.2 as infected. I found it surprisingly difficult to learn about how the Win32/Adclicker.JO virus operates, and how eTrus

[R] prblems changing directory in mpi snow clusters

2008-09-30 Thread tolga . i . uzuner
Dear R Users, I am attempting to use snow with rmpi. My configuration is: - R Version 2.7.2, rmpi - RMPI 0.5-6 - DeinoMPI 1.1.0 - Windows Xp SP2 I can sucessfully create a cluster and execute simple commands but for some reason, I cannot change the working directory in my nodes. > noclusters<

[R] Vanishing boxplots with transparency and zero margins

2008-09-30 Thread Keith Ponting
Dear All, I am observing unusual behaviour when trying to completely fill a page with boxplots. The problem only appears when I have both of: * zero right or bottom margins * colours with some degree of transparency I first noticed this on R 2.7.1; it is still happening on a fresh install of 2.8.

Re: [R] Weibull Verteilung

2008-09-30 Thread Tsjerk Wassenaar
Beste Luis, Ten eerste wil ik graag meedelen dat het aanbeveling verdient als iedereen zich bedient van een gezamenlijke taal (Gesamtsprache) wanneer het internationale communicatie betreft. Hoewel de taal van voorkeur uiteraard discutabel is, schijnt er toch redelijke consensus te zijn dat heden

[R] Weibull Verteilung

2008-09-30 Thread Hoeks, Luis
Hallo r-Projekt Team, ich bin Anfänger in R und könnte ein wenig Hilfe gebrauchen. Ich möchte eine Weibullverteilung (Weibullgerade und Genauigkeitskurven) berechnen und plotten. Außerdem benötige ich den Formfaktor, den Skalierungsfaktor und Werte wie B5, B10, B50, B90, B95. In der Regel habe

[R] rpvm for windows anyone ?

2008-09-30 Thread tolga . i . uzuner
Dear R Users, Is there a version of rpvm available for windows ? I have recently had some problems with snow using SOCKS and was considering PVM as an alternative. Thanks in advance, Tolga Generally, this communication is for informational purposes only and it is not intended as an offer or s

Re: [R] par() default values

2008-09-30 Thread Eik Vettorazzi
How about reading the help file of "par"? The first example exactly demonstrates what you want to do. hth. Benoit Boulinguiez schrieb: Hi all, Is that possible to get back to the par() default values easily? I played a bit with par() Regards/Cordialement - Benoit Boulinguiez

Re: [R] Desperatly seeking Parallel R simulation with Windows XP

2008-09-30 Thread Rainer M Krug
On Tue, Sep 30, 2008 at 10:18 AM, quant15 <[EMAIL PROTECTED]> wrote: > > Hello R experts, > > I've been searching for weeks a way to use my quad core xeon to increase > speed of a very-very computer-intensive simulation I must do for my works. > > It seems that most purpose-made packages for R : Sn

[R] calculating weighted correlation coefficients

2008-09-30 Thread Elena Wilson
Dear Help, I'm trying to calculate a weighted correlation matrix from a data frame with 6 columns (variables) and 297 observations extracted from the regression. The last column is a weight column which I want to apply. $ model:'data.frame': 297 obs. of 6 variables: ..$ VAR1

[R] Desperatly seeking Parallel R simulation with Windows XP

2008-09-30 Thread quant15
Hello R experts, I've been searching for weeks a way to use my quad core xeon to increase speed of a very-very computer-intensive simulation I must do for my works. It seems that most purpose-made packages for R : Snow, Rmpi, snowfall,... are designed for Linux based OS. I do not have access to

[R] par() default values

2008-09-30 Thread Benoit Boulinguiez
Hi all, Is that possible to get back to the par() default values easily? I played a bit with par() Regards/Cordialement - Benoit Boulinguiez Ph.D Ecole de Chimie de Rennes (ENSCR) Bureau 1.20 Equipe CIP UMR CNRS 6226 "Sciences Chimiques de Rennes" Campus de Beaulieu, 263 Avenue du

[R] snow: Problems with cluster

2008-09-30 Thread tolga . i . uzuner
Dear R Users, I have come across a problem with the snow package across two PCs recently. The error message is : "Error in unserialize(node$con) : error reading from connection" I was wondering if anyone else has ever come across this and if there are any suggestions as to what it may mean a

[R] Version 2.7.2 GUI acts awkward?

2008-09-30 Thread Gregor Rolshausen
hi, I am running R 2.7.2 Windows - recently the GUI-windows (for example to "change directory" or "read in R-scripts") do not open - well, they open, but close down directly afterwards. I can't select a directory or file ... I tried re-installing R - same problem again. does anybody have an

[R] crashes while using Rattle (GTK+)

2008-09-30 Thread Tomislav Puđa
Hi, I'm using R 2.7.2 for Windows.I have also installed gtk-dev-2.12.9 and rattle 2.3.65. When I work in rattle, I occasionally get these messages : GLib-WARNING (recurser) **: g_main_context_prepare() called recursively from within a source's check() or prepare() member. aborting or GLib-W