Re: [R] Populating then sorting a matrix and/or data.frame

2010-11-10 Thread Noah Silverman
That was a typo. It should have read: results[results$one < 100,] It does still fail. There is ONE column that is text. So my guess is that R is seeing that and assuming that the entire data.frame should be factors. -N On 11/10/10 11:16 PM, Michael Bedward wrote: Hello Noah, If you set t

Re: [R] Populating then sorting a matrix and/or data.frame

2010-11-10 Thread Michael Bedward
Hello Noah, If you set these names... > names(results) <- c("one", "two", "three") this won't work... > results[results$c < 100,] because you don't have a column called "c" (unless that's just a typo in your post). > I tried making it a data.frame with > foo <- data.frame(results) > > But that

[R] NA handling problem in capscale (vegan)

2010-11-10 Thread Nevil Amos
I am having a problem with NA handling in capscale function. as I understand it from the help capscale should permit NA values when na.action=na.mit or na.exclude, however I am getting the error Error in X[nas, , drop = FALSE] : incorrect number of dimensions trivial example is pasted below

Re: [R] Count continuous dates

2010-11-10 Thread Tim Clark
Josh, Great use of rle()!  I knew it had to fit in there somewhere!  Thanks for the help! Tim  Tim Clark Marine Ecologist National Park of American Samoa Pago Pago, AS 96799 - Original Message From: Joshua Wiley To: Tim Clark Cc: r help r-help Sent: Wed, November 10, 2010 7:45:1

Re: [R] Difficult doubt about choose distances randomly in a matrix with a probability of event

2010-11-10 Thread Michael Bedward
Hello Judit, The code below is a toy simulation function that takes as arguments a matrix representing the initial population, a dispersal kernel, global survival probability and max number of iterations to run. It doesn't implement exactly what you described in your post but if you study the cod

Re: [R] Count continuous dates

2010-11-10 Thread Joshua Wiley
Hi Tim, Thanks for providing nice sample data! It made this super easy :) ## use diff() to find the differences ## use rle() to find the run lengths ## use max to find the highest one max(rle(as.vector(diff(x)))$lengths) Cheers, Josh On Wed, Nov 10, 2010 at 10:07 PM, Tim Clark wrote: > Dear

Re: [R] create a pairwise coocurrence matrix

2010-11-10 Thread Joshua Wiley
Hi Tax, I played around with several different functions. I keep thinking that there should be an easier/faster way, but this is what I came up with. Given the speed tests, it looks like foo4 is the best option (they all give identical results). The functions foo1 <- function(object)

Re: [R] [lattice] densityplot label the peak.

2010-11-10 Thread baptiste auguie
Hi, The easiest way might be the directlabels package from R-forge. Otherwise, you could write your own panel function. HTH, baptiste On 10 November 2010 23:01, Joon Yeong Kim wrote: > Hi, > > I've been trying to find a way to label the the peak or mean of a > densityplot for a while but have

[R] Count continuous dates

2010-11-10 Thread Tim Clark
Dear List, I have a series of dates and I am needing to know the greatest length of continuous dates - i.e. the number of dates before a break in the series.  For example, below there are three continuous series of dates with lengths 4, 6, and 8.  How can I count the number of continuous dates

[R] plot options including formatting axes

2010-11-10 Thread sachinthaka . abeywardana
Hi All, Currently my plot shows the y-axis in scientific notation (1e07 and so on). I want to be able to display this in dollars such that it shows $10,000,000 (including the commas). How do I do this. Also with the xlabel and ylabel. I've specified: 'title('Cash vs Time',xlab='Period',ylab='');

Re: [R] Is there effective way using R to select variables subset!

2010-11-10 Thread Greg Snow
Check out the rms package, especially the validate function. -- Gregory (Greg) L. Snow Ph.D. Statistical Data Center Intermountain Healthcare greg.s...@imail.org 801.408.8111 > -Original Message- > From: r-help-boun...@r-project.org [mailto:r-help-boun...@r- > project.org] On Behalf Of

Re: [R] Kolmogorov Smirnov Test

2010-11-10 Thread Greg Snow
The way you are running the test the null hypothesis is that the data comes from a normal distribution with mean=0 and standard deviation = 1. If your minimum data value is 0, then it seems very unlikely that the mean is 0. So the test is being strongly influenced by the mean and standard devi

[R] Populating then sorting a matrix and/or data.frame

2010-11-10 Thread Noah Silverman
Hi, I have a process in R that produces a lot of output. My plan was to build up a matrix or data.frame "row by row", so that I'll have a nice object with all the resulting data. I started with: results <- matrix(ncol=3) names(results) <- c("one", "two", "three") Then, when looping through

Re: [R] ff objects saving problem

2010-11-10 Thread Xiaobo Gu
Hi Jens, I have installed RTools, on my Win XP SP3 notebook, there are still errors when running the examples, > cat("let's create some ff objects\n") let's create some ff objects > n <- 8e3 > a <- ff(sample(n, n, TRUE), vmode="integer", length=n, filename="d:/tmp/a.ff") > b <- ff(sample(255, n,

Re: [R] can't get/find or install R.dll?

2010-11-10 Thread dartdog
Ok the DLL is in the C:\Program Files\R\R-2.12.0\bin\i386 directory but as the error shows it seems that rpy2 is looking in R.dll within C:\PROGRA~1\R\R-212~1.0 So I'm a bit lost here... On Nov 10, 6:51 pm, Duncan Murdoch wrote: > On 10/11/2010 5:50 PM, dartdog wrote: > > > Just installed a 1st

[R] Kolmogorov Smirnov Test

2010-11-10 Thread Kerry
I'm using ks.test (mydata, dnorm) on my data. I know some of my different variable samples (mydata1, mydata2, etc) must be normally distributed but the p value is always < 2.0^-16 (the 2.0 can change but not the exponent). I want to test mydata against a normal distribution. What could I be doing

[R] Is there effective way using R to select variables subset!

2010-11-10 Thread Dorm Eight
Hi, I wonder is there any way to select a subset useful variables from a large data set of variables to build a linear function with a single y. I know some methods without validation in the selection procedure. I want to know is there any way to do effectively with validation? thanks! Zhizho

Re: [R] can't get/find or install R.dll?

2010-11-10 Thread Duncan Murdoch
On 10/11/2010 5:50 PM, dartdog wrote: Just installed a 1st time use of R on a win vista 64 box (4gigram) but asked for the 32 bit version.. I plan to use via Rpy and or Rpy2 installation is via "R-2.12.0-win.exe" got the following when trying to test... raise RuntimeError("Unable to locate

Re: [R] trouble with plotting data- possible bug?

2010-11-10 Thread sachinthaka . abeywardana
whoops, sorry for the trouble everyone, managed to solve it. I didnt set the ylim range so ofcourse it couldn't "see" where the other plots were going to be. Thanks Sachin p.s. sorry about the corporate notice --- Please consider the environment before printing this email --- Allianz - Best Gen

Re: [R] change axis labels and text size in "splom"

2010-11-10 Thread Dennis Murphy
Hi: A perusal of the splom() help page indicates the following: ...If you are trying to fine-tune your splom plot, definitely look at the panel.pairs help page. The scales argument is usually not very useful in splom, and trying to change

[R] change axis labels and text size in "splom"

2010-11-10 Thread Xiaoqi Cui
Hi everyone: I'm using "splom" to draw scatterplot matrix. I'm wondering how can I change the axis labels to c(1,10,100,1000,...) instead of c(1,2,3,...), and also how can I change the text size (for labels)? Thanks a lot! xcui __ R-help@r-project.or

Re: [R] log-transformed linear regression

2010-11-10 Thread servet cizmeli
Dear List, I would like to take another chance and see if there if someone has anything to say to my last post... bump servet On 11/10/2010 01:11 PM, servet cizmeli wrote: Hello, I have a basic question. Sorry if it is so evident I have the following data file : http://ekumen.homelin

[R] trouble with plotting data- possible bug?

2010-11-10 Thread sachinthaka . abeywardana
Hi all, When I write out some values and then use 'plot' and 'lines' respectively I can get R to plot me two lines. However when I get the data from a csv file and run it I only manage to get one line running (whichever was invoked first). The sample files are attached below and I've reproduced t

Re: [R] Format table help

2010-11-10 Thread Phil Spector
Cameron - Are you sure Mthticker is a table? It looks like a list containing named vectors. Are you trying to reformat the list (Mthticker), or to reformat one element in the list (MthTicker[[i]]). - Phil Spector

[R] can't get/find or install R.dll?

2010-11-10 Thread dartdog
Just installed a 1st time use of R on a win vista 64 box (4gigram) but asked for the 32 bit version.. I plan to use via Rpy and or Rpy2 installation is via "R-2.12.0-win.exe" got the following when trying to test... raise RuntimeError("Unable to locate R.dll within %s" % R_HOME) RuntimeError:

[R] Format table help

2010-11-10 Thread cameron
i have table Mthticker > MthTicker[[i]] 01/02/04 02/02/04 03/01/04 04/01/04 05/03/04 06/01/04 07/01/04 08/02/04 LHN04LHQ04LHQ04LHV04LHZ04LHG05LHJ05LHK05 09/01/04 10/01/04 11/01/04 12/01/04 01/03/05 02/01/05 03/01/05 04/01/05 LHK05LHM05LHM05LHN05L

Re: [R] Calling R from MS SQL Server

2010-11-10 Thread Sven Garbade
Maybe you want somelthing like a PL with R, eg. PL/R http://www.joeconway.com/plr/? Can you migrate to PostgreSQL? Regards, Sven 2010/11/10 James Evans : > We would like to call R functions from within MS SQL Server queries. Any > advice on this would be appreciated. > > Thanks! > > _

Re: [R] maptools package

2010-11-10 Thread Aleksandr Andreev
OK, that loads the shape file. But now when I do: submap <- subset(spb, as.character(spb$Name) == 'Vasilevsky Island') the submap still has the whole city, not just the subset. Is there now a different way of extracting a subset from a map? A 2010/11/10 Phil Spector : > Aleksandr - >   What ha

Re: [R] randomForest can not handle categorical predictors with more than 32 categories

2010-11-10 Thread Erik Iverson
Well, the error message seems relatively straightforward. When you run str(x) (you did not provide the data) you should see 1 or more components are factors that have more than 32 levels. Apparently you can't include those predictors in a call to randomForest. You might find the following line

[R] [lattice] densityplot label the peak.

2010-11-10 Thread Joon Yeong Kim
Hi, I've been trying to find a way to label the the peak or mean of a densityplot for a while but haven't been successful. Does anyone know how to accomplish this? Thank you for your help in advance. Joon [[alternative HTML version deleted]] __

Re: [R] Inserting Missing Data

2010-11-10 Thread Peter Langfelder
On Wed, Nov 10, 2010 at 1:38 PM, wrote: > > Greetings >     I'm attempting to insert missing data on the smallest size class of > cave cricket instars into a data frame. The data involve censusing > photoplots (plots) of roosting cave crickets in which we discern in four > instars or size classes

Re: [R] create a pairwise coocurrence matrix

2010-11-10 Thread Joshua Wiley
Hi Tax, Because the list dost not accept HTML messages (per posting guide), your message was converted to plain text, and your table is difficult to read. My suggestion would be to start with: ?table ?xtabs If you make up a minimal example of the data you have, and email it to us we can give mo

[R] Inserting Missing Data

2010-11-10 Thread Kurt_Helf
Greetings I'm attempting to insert missing data on the smallest size class of cave cricket instars into a data frame. The data involve censusing photoplots (plots) of roosting cave crickets in which we discern in four instars or size classes. I need to insert data on size class one into a da

Re: [R] NetWorkSpace from REvolution; Distributed Computing setup questions

2010-11-10 Thread yeoldefortran
This is very late, but in case you are still looking for the solution to this: Everything you did was right on, except the argument to sleigh is 'rprog' instead of 'RProg'. That should fix the problem. -- View this message in context: http://r.789695.n4.nabble.com/NetWorkSpace-from-REvolution-D

Re: [R] randomForest can not handle categorical predictors with more than 32 categories

2010-11-10 Thread Mattia Prosperi
try to transform the attributes that have more than 32 levels into dummy binary variables. 2010/11/10 Mai Dang : > I received this error > Error in randomForest.default(m, y, ...) : > Can not handle categorical predictors with more than 32 categories. > > using below code > > library(randomForest)

[R] randomForest can not handle categorical predictors with more than 32 categories

2010-11-10 Thread Mai Dang
I received this error Error in randomForest.default(m, y, ...) : Can not handle categorical predictors with more than 32 categories. using below code library(randomForest) library(MASS) memory.limit(size=12999) x <- read.csv("D:/train_store_title_view.csv", header=TRUE) x <- na.omit(x) set.seed(1

[R] biglm and epicalc ROC curves

2010-11-10 Thread mah
Hello list, I am trying to avoid "Rifying" some of my SAS code to generate ROC plots, and the logistic.display() and lroc() functions in the epicalc package do what I want. However, I must generate my logistic model with bigglm because I have 1) limited hardware, 2) ~2.5 million rows, and 4 categ

Re: [R] force apply not to drop the dimensions of FUN results ?

2010-11-10 Thread Yves . Reecht
Thank you very much Claudia, That (the first form) works perfectly. Easily made generic using head and tail on the dim attribute. All the best, Yves Claudia Beleites a écrit : Dear Yves, You may not need to do more than set the dim attribute correctly: dim (test) <- c (dim (myArray) [c (3

[R] Calling R from MS SQL Server

2010-11-10 Thread James Evans
We would like to call R functions from within MS SQL Server queries. Any advice on this would be appreciated. Thanks! __ R-help@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-help PLEASE do read the posting guide http://www.R-proje

Re: [R] ggplot2 problem in interacting mode

2010-11-10 Thread Ista Zahn
Hi, Here are a couple of suggestions: -- Start R without loading startup scripts etc. (R --vanilla) and see if it works. If yes, there is something loading in your startup file or restored environment that is causing problems. -- Upgrade to the latest version of R HTH, Ista On Wed, Nov 10, 2010

[R] create a pairwise coocurrence matrix

2010-11-10 Thread tax botsis
Hi all, I am trying to construct a pairwise coocurrence matrix for certain terms appearing in a number of documents. For example I have the following table with binary values showing the presence or absence of a certain term in a document: term1 term2 term3 term4 term5 doc1 1 1 0 0 1 doc2 1 1

[R] ggplot2 problem in interacting mode

2010-11-10 Thread zhenjiang xu
Hi all, When running R interactively, I have the problem as following: > library(ggplot2) Loading required package: reshape Loading required package: plyr Attaching package: 'reshape' The following object(s) are masked from 'package:plyr': round_any Loading required package: grid Loading

Re: [R] Fuzzy merge using timestamps

2010-11-10 Thread Ian Craig
The sorting for the times is below: checkTime <- checkTimes[order(checkTimes$ARC,checkTimes$times, decreasing = FALSE),] After the merging data frame is created I use these two commands to merge the checkTime data frame with the other two dataframes: data_gps <- merge(gpsdata,match, by= c("gpsAR

Re: [R] par mfrow in "function" problem

2010-11-10 Thread Joshua Wiley
Dear Casper, This is because you create two histograms, the first with the direct call to hist(), the second at: h = hist(x). That is also why even though you set the xlab and main to be blank in your first one,the histogram with the normal line added actually was titled. Normally, hist() just o

Re: [R] p-value from regsubsets

2010-11-10 Thread Greg Snow
What hypothesis do you expect the p-values to be testing? What you would get from regsubsets is unlikely to test any hypothesis of interest. If you really feel the need for p-values then the safest approach is probably the function SnowsCorrectlySizedButOtherwiseUselessTestOfAnything in the

[R] par mfrow in "function" problem

2010-11-10 Thread casperyc
Hi all, I defined the following # myhist=function(x){ hist(x,xlab="",main="") h=hist(x) xfit=seq(min(x),max(x),length=100) yfit=dnorm(xfit,mean(x),sd=sd(x)) yfit=yfit*diff(h$mids[1:2])*length(x) lines(xfit, yfit, col="bl

Re: [R] leaps::regsubsets p-value

2010-11-10 Thread Frank Harrell
P-values have little meaning in this context. Nor do regression coefficient estimates and especially standard errors (they are biased). Frank - Frank Harrell Department of Biostatistics, Vanderbilt University -- View this message in context: http://r.789695.n4.nabble.com/leaps-regsubsets

Re: [R] standardized/studentized residuals with loess

2010-11-10 Thread Joshua Wiley
Hi Oliver, As a warning, I may be missing something too. I did not see something explicit in base R or MASS. In a quick scan of the fourth edition of the MASS book, I did not read anything that it is illogical/unreasonable to try to find standardized residuals (but my knowledge of local regressi

Re: [R] Fuzzy merge using timestamps

2010-11-10 Thread Sarah Goslee
Hi Ian, Did you see the second part of my request, for a simple reproducible example? At the very least, we need your merge and sort code, since it sounds like that's where the problem truly lies. Sarah On Wed, Nov 10, 2010 at 2:02 PM, Ian Craig wrote: > So here is a sample of the datasets.  I

Re: [R] maptools package

2010-11-10 Thread Phil Spector
Aleksandr - What happens when you use library(maptools) spb = readShapePoly('/home/sasha/Documents/maps/spb.shp') - Phil Spector Statistical Computing Facility Department

Re: [R] Fuzzy merge using timestamps

2010-11-10 Thread Ian Craig
So here is a sample of the datasets. I have modified them for the purposes of circulating to solve this problem. I have already added the ID and key as seen in the code below. Any ideas? gpsdata gpsARC Protocol TrackUTCDate UTCTime LocalDate LocalTimey x Altitude_m Speed

[R] Systat NRM function

2010-11-10 Thread Felipe Carrillo
Hi: I have some old scripts from when I used to use Systat and have the NRM(value1,value2) that I need to use with R. Does anyone know the R equivalency to this function? Thanks   Felipe D. Carrillo Supervisory Fishery Biologist Department of the Interior US Fish & Wildlife Service California, U

[R] nonlinear regression with an iterativ function

2010-11-10 Thread Christof Kluß
Hi, we have a function that calculates a value for each day of the year. For example an iterative function like actvalue_0 := 0 actvalue_ {t+1} := actvalue_t + f(param_1,param_2,actvalue_t) and for some days we have measurements. Now we want to choose param_1 and param_2 so that the function va

Re: [R] plotting histograms/density plots in a triangular layout?

2010-11-10 Thread Phil Spector
Karin - An example would have been nice. Perhaps this will be helpful: somedat = data.frame(x=sample(1:7,1000,replace=TRUE), + y=sample(1:7,1000,replace=TRUE), + z=rnorm(1000)) somedat$grp = interaction(somedat$x,somedat$y) Now we need to order

Re: [R] Extending a plot in a loop

2010-11-10 Thread jim holtman
If you want to read in all the files and then set the range so you can print a parameter from each one on a single chart, there is some information in the archives about how to do this. A brief outline is below (definitely untested) allFiles <- lapply(fileList, read.table, header=TRUE, ... other

Re: [R] rcom close Excel problem

2010-11-10 Thread zlatan24
Several weeks ago my father told me one funny or not thing. I suggested him a tool for resolving a trouble. To my great surprise it helped him and father thanked me a lot and presented a gift. I suppose that this tool might be good solution for solving varied troubles with excel files - http://ww

Re: [R] maptools package

2010-11-10 Thread Jonathan P Daily
I know the default plot() method expects dat$x and dat$y to exist and be equal if you simply try > plot(dat) Try looking at > methods(plot) to see if there is a specified method from maptools, then check documentation on ?plot.methodfrommaptools Otherwise, check spb for $x and $y objects. -

Re: [R] Installing Packages

2010-11-10 Thread Duncan Murdoch
On 10/11/2010 12:26 PM, Caskey, Susan wrote: Hi.. I am using R as a user, another group built everything I am using. But I need to install some packages and my only internet access is via a web-proxy. I have hunted though the docs and I'm not finding anything on setting a proxy in the packag

Re: [R] error on R CMD rtags

2010-11-10 Thread Duncan Murdoch
On 10/11/2010 12:13 PM, Liviu Andronic wrote: Dear all I'm getting a strange error when trying to use rtags() to generate tags in Emacs format. r...@liv-laptop:/usr/lib/R# R CMD rtags -o /usr/local/build/ETAGS --no-Rd --no-c library/ Tagging R files under library/; writing to /usr/local/build/ET

[R] error bars in lattice barchart

2010-11-10 Thread zhenjiang xu
Hi all, I've read the emails of Dan, Deepayan and Sundar about adding error bars to the lattice plots ( https://stat.ethz.ch/pipermail/r-help/2006-October/114883.html), but I still have the problem when I want to adding error bars to barchart. I tried both the solution of Deepayan and Sundar but w

Re: [R] Extending a plot in a loop

2010-11-10 Thread Sebastian Gibb
Am Mittwoch, 10. November 2010, 19:22:38 schrieb Nasrin Pak: > My problem is that I have a data set for every day of measurement in a > seperate file and I want to plot one parameter of the data for all the days > in one graph. I tried to use for loop but only the last data remains in the > program

Re: [R] RGoogleDocs stopped working

2010-11-10 Thread Duncan Temple Lang
Hi Harlan I just tried to connect to Google Docs and I had ostensibly the same problem. However, the password was actually different from what I had specified. After resetting it with GoogleDocs, the getGoogleDocsConnection() worked fine. So I don't doubt that the login and password are correct,

[R] leaps::regsubsets p-value

2010-11-10 Thread James Stegen
Hi, does anyone know if there is a way to easily extract p-values from the regsubsets() function? Thanks, James Stegen p.s. this is a reposting due to me not putting in a useful subject heading... -- James C. Stegen NSF Postdoctoral Fellow in Bioinformatics University of North Carolina Chapel Hi

[R] Extending a plot in a loop

2010-11-10 Thread Nasrin Pak
My problem is that I have a data set for every day of measurement in a seperate file and I want to plot one parameter of the data for all the days in one graph. I tried to use for loop but only the last data remains in the program memory, I don`t know how to plot each day`s data continusly after th

[R] standardized/studentized residuals with loess

2010-11-10 Thread Oliver Frings
Hi all, I'm trying to apply loess regression to my data and then use the fitted model to get the *standardized/studentized residuals. I understood that for linear regression (lm) there are functions to do that:* * * fit1 = lm(y~x) stdres.fit1 = rstandard(fit1) studres.fit1 = rstudent(fit1) I was

[R] plotting histograms/density plots in a triangular layout?

2010-11-10 Thread Karin Lagesen
Hi! I have a set of 49 pairwise comparisons that I have done. From this I would like to plot either histograms or the density plots of the values I get. Now, I can plot one histogram per comparison, but I have problems getting the output I want. When plotting like I normally would do: histog

[R] Difficult doubt about choose distances randomly in a matrix with a probability of event

2010-11-10 Thread Barroso, Judit
I would like to build a model in R to simulate the seed dispersal by one plant. The plant produced 5 seeds and the probability of falling inside the eight closest space was 0.8 and in the next space 0.2 and in the rest space 0: 0 0 0 0 0 0 0.2 0.2 0.2 0.2 0.2 0 0.2 0.8 0.8 0.8 0.2

[R] Fuzzy merge using timestamps

2010-11-10 Thread blurg
Let it be know I am still a neophyte in the R-community forum world, so please don't flame me too bad. I have two sets of data, each with a set of timestamps. I would like to somehow merge the datasets based on the timestamps and an individual identifier. That is there are several individual

Re: [R] Plot Axes

2010-11-10 Thread jim holtman
apply the xlim/ylim in the initial plot plot(..., xlim=range(H2, H.10, H.20, H.50, H.100), ylim=range(D2, D.10, D.20, D.50, D.100)) On Wed, Nov 10, 2010 at 12:50 PM, dpender wrote: > > R community, > > I am creating a bivariate return level plot by adding calculated return > period values as lin

Re: [R] Fuzzy merge using timestamps

2010-11-10 Thread Sarah Goslee
On Wed, Nov 10, 2010 at 12:57 PM, Ian Craig wrote: > Greetings Supreme Council of R Masters, Nice. :) > I have two sets of data, each with a set of timestamps.  I would like to > somehow merge the datasets based on the timestamps and an individual > identifier.  That is there are several individ

[R] log-transformed linear regression

2010-11-10 Thread servet cizmeli
Hello, I have a basic question. Sorry if it is so evident I have the following data file : http://ekumen.homelinux.net/mydata.txt I need to model Y~X-1 (simple linear regression through the origin) with these data : load(file="mydata.txt") X=k[,1] Y=k[,2] aa=lm(Y~X-1) dev.new() plot(X,Y,l

[R] maptools package

2010-11-10 Thread Aleksandr Andreev
A few years back, I wrote some code to plot maps with the maptools package. Now I am trying to reproduce my results, only to find out that maptools has been updated and my code no longer works. I've been able to fix the first part of it by forcing spb <- maptools:::read.shape("/home/sasha/Document

[R] Fuzzy merge using timestamps

2010-11-10 Thread Ian Craig
Greetings Supreme Council of R Masters, Like toddler, I have gotten my head stuck in the banisters of R ... again. Let it be know I am still a neophyte in the R-community forum world, so please don't flame me too bad. I have two sets of data, each with a set of timestamps. I would like to someh

Re: [R] Plot Axes

2010-11-10 Thread dpender
http://r.789695.n4.nabble.com/file/n3036574/plot.jpeg -- View this message in context: http://r.789695.n4.nabble.com/Plot-Axes-tp3036571p3036574.html Sent from the R help mailing list archive at Nabble.com. __ R-help@r-project.org mailing list https

[R] Plot Axes

2010-11-10 Thread dpender
R community, I am creating a bivariate return level plot by adding calculated return period values as lines onto an existing plot using the following code with the points representing the return periods. plot(H2,D2,pch="+",axes=TRUE) points(H.10,D.10, type="l",col="blue") points(H.20,D.20, type=

Re: [R] Installing Packages

2010-11-10 Thread Nikos Rachmanis
Hi Sue, Try to download the packages through here http://cran.r-project.org/web/packages/ then r/packages/install packages from local zip files if you are running a script do not forget to cal them i hope that helps, N On Wed, Nov 10, 2010 at 12:26 PM,

[R] Installing Packages

2010-11-10 Thread Caskey, Susan
Hi.. I am using R as a user, another group built everything I am using. But I need to install some packages and my only internet access is via a web-proxy. I have hunted though the docs and I'm not finding anything on setting a proxy in the package install command. Any help would be really ap

[R] error on R CMD rtags

2010-11-10 Thread Liviu Andronic
Dear all I'm getting a strange error when trying to use rtags() to generate tags in Emacs format. r...@liv-laptop:/usr/lib/R# R CMD rtags -o /usr/local/build/ETAGS --no-Rd --no-c library/ Tagging R files under library/; writing to /usr/local/build/ETAGS (overwriting)... [..] Error: '\.' is an un

Re: [R] ANOVA table and lmer

2010-11-10 Thread JBooth-547
Hi Mark, Thanks for your response. After some detective work I figured out the answer to my question. The models > lm.split=lm(Y~B*V+B*N+V*N) > lmer.split=lmer(Y~V+N+V:N+(1|B)+(1|B:V)+(1|B:N)) contain exactly the same terms. The difference is that blocking factor (B) is fixed in first model b

[R] "R Cookbook" now available

2010-11-10 Thread Paul Teetor
Dear R community members: The "R Cookbook" from O'Reilly is now available on-line in a Rough Cuts version. http://oreilly.com/catalog/9780596809164/ The book is a collection of recipes for R covering a variety of topics, including: getting started, data structures, input and output, ge

[R] package np, convolution functions

2010-11-10 Thread Chris Carleton
Hello List, I'm trying to find a convenient way of performing a weighted convolution on multiple n-dimensional kernel density estimates (n-d pdfs) produced by the np package function npudens()/npudist(). Are there any functions in R that will take a list of functions and a list of weights and conv

Re: [R] sem: variance explained

2010-11-10 Thread John Fox
Dear James, Model-implied variances and covariances of the non-error variables (observed and latent) are given by (I - A)^-1 P [(I - A)^-1]', where the A and P matrices are from the RAM formulation of the model, and are in the object returned by sem(), and I is an identity matrix. Your model presu

Re: [R] ff objects saving problem

2010-11-10 Thread Jens Oehlschlägel
Xiaobo, You indeed need external 'zip' and 'unzip' utlities in the path, citing from ffsave's help: "using an external zip utility, e.g. for windows in Rtools on [http://www.murdoch-sutherland.com/Rtools/]";. Please note that the mentioned utilities have a 4 GB limit for the zip file, AFAIK. I

[R] odfWeave/XML Windows issue

2010-11-10 Thread Dave_F
I am getting the following error when using odfWeave Error in xmlEventParse(infile, handlers = handlers, trim = FALSE, state = state) : File content_1.xml does not exist This appears to be the same issue detailed in http://markmail.org/message/qsrqdtozizlngbrt#query:+page:1+mid:qsrqdtozizl

Re: [R] Decimal places in a function output

2010-11-10 Thread Marc Schwartz
On Nov 10, 2010, at 9:51 AM, Liliana Pacheco wrote: > Hi R users > I have a very simple function. As the return of that function I want the > answer with 5 decimal places, but it hasn't worked with sprintf, nor with > format, nor print. This is how I used sprintf: > > cuant<-function(r,n){ > d<-s

Re: [R] Decimal places in a function output

2010-11-10 Thread Duncan Murdoch
On 10/11/2010 10:51 AM, Liliana Pacheco wrote: Hi R users I have a very simple function. As the return of that function I want the answer with 5 decimal places, but it hasn't worked with sprintf, nor with format, nor print. This is how I used sprintf: cuant<-function(r,n){ d<-seq(-1,1,by=0.001)

[R] Decimal places in a function output

2010-11-10 Thread Liliana Pacheco
Hi R users I have a very simple function. As the return of that function I want the answer with 5 decimal places, but it hasn't worked with sprintf, nor with format, nor print. This is how I used sprintf: cuant<-function(r,n){ d<-seq(-1,1,by=0.001) . . . (SOME CALCULATIONS) . . . return(sprintf("%

Re: [R] Parsing txt file

2010-11-10 Thread karthicklakshman
Hello Jim, hello all, Thanks very much for the inputs, I used the code and it solved my problem special thanks to Jim Holtman for the code. Regards, karthick -- View this message in context: http://r.789695.n4.nabble.com/Parsing-txt-file-tp3035749p3036284.html Sent from the R help mailin

[R] RGoogleDocs stopped working

2010-11-10 Thread Harlan Harris
Hello, Some code using RGoogleDocs, which had been working smoothly since the summer, just stopped working. I know that it worked on November 3rd, but it doesn't work today. I've confirmed that the login and password still work when I log in manually. I've confirmed that the URL gives the same err

[R] sem: variance explained

2010-11-10 Thread James Stegen
Hi, does anyone know if there is a way to extract the variance of each variable explained in a structural equation model when using the sem() function? Thanks, James Stegen -- James C. Stegen NSF Postdoctoral Fellow in Bioinformatics University of North Carolina Chapel Hill, NC 919-962-8795 ste

[R] p-value from regsubsets

2010-11-10 Thread James Stegen
Hi, does anyone know if there is a way to easily extract p-values from the regsubsets() function? Thanks, James Stegen -- James C. Stegen NSF Postdoctoral Fellow in Bioinformatics University of North Carolina Chapel Hill, NC 919-962-8795 ste...@email.unc.edu http://www.unc.edu/~stegen/index.html

Re: [R] simulation from pareto distn

2010-11-10 Thread Giovanni Petris
For a Pareto distribution, even a truncated one, the inverse CDF method should be straightforward to implement. Giovanni Petris On Tue, 2010-11-09 at 10:50 -0600, cassie jones wrote: > Dear all, > > I am trying to simulate from truncated Pareto distribution. I know there is > a package called P

Re: [R] R Applications for Force.com/ Salesforce

2010-11-10 Thread Ajay Ohri
you are right. face palm to forehead. sorry for the spam Websites- http://decisionstats.com http://dudeofdata.com Linkedin- www.linkedin.com/in/ajayohri On Wed, Nov 10, 2010 at 8:08 PM, Yihui Xie wrote: > I guess this is not OT for r-devel and r-packages -- it's simply spam. > > Regards, >

[R] clustering association rules

2010-11-10 Thread Kuusik , Jüri
Hello. I have a general question regarding to clustering of association rules. According to http://cran.r-project.org/web/packages/arules/vignettes/arules.pdf "4.7 Distance based clustering transactions and associations" there is possibility for creating clusters of association rules. I do not u

Re: [R] library(kernlab) --- unable to load shared library

2010-11-10 Thread Yuliya Matveyeva
I am very sorry. It's just that it's not my computer that the problem occured on... It's at work. So I am going to see what distribution it was when I get there. But I have no chance to know how R was installed... since it wasn't me who installed it. But could you please tell me , at least, where

Re: [R] matrix limit

2010-11-10 Thread Ben Bolker
zhiji19 gmail.com> writes: > I need to write R code for lim(I+X/n)^n with "repeat loop". (note: limit is > n from 1 to infinity, I is identity matrix, X is square symmetric matrix) > Can anyone please provide help with my question. > Here's a more efficient solution. If you *need* to use a rep

Re: [R] R-2.12.0 problem on Sparc Solaris 10

2010-11-10 Thread Zhang,Jun
I used solstudio12.2 to build 32-bit R. How do you get around the Matrix segfault? -Original Message- From: Prof Brian Ripley [mailto:rip...@stats.ox.ac.uk] Sent: Wednesday, November 10, 2010 12:46 AM To: Zhang,Jun Cc: 'r-help@r-project.org' Subject: Re: [R] R-2.12.0 problem on Sparc So

Re: [R] R-2.12.0 problem on Solaris 10

2010-11-10 Thread Zhang,Jun
Thank you Dave for the reply. I used solstudio12.2, and followed the R admin installation instruction for Solaris. When I run R as the compiled result, there is a line "Platform: sparc-sun-solaris2.10 (32-bit)". Jun CC="cc -xc99" CPPFLAGS="-I/opt/csw/include" CFLAGS="-O -xlibmieee" F77=f95 F

Re: [R] R Applications for Force.com/ Salesforce

2010-11-10 Thread Yihui Xie
I guess this is not OT for r-devel and r-packages -- it's simply spam. Regards, Yihui -- Yihui Xie Phone: 515-294-2465 Web: http://yihui.name Department of Statistics, Iowa State University 2215 Snedecor Hall, Ames, IA On Wed, Nov 10, 2010 at 2:19 AM, Gavin Simpson wrote: > On Wed, 2010-11-10

Re: [R] Parallel code runs slower!

2010-11-10 Thread Mike Marchywka
> From: santosh.srini...@gmail.com > To: r-help@r-project.org > Date: Wed, 10 Nov 2010 19:37:29 +0530 [[elided Hotmail spam]] > > My parallel code is running slower than my non-parallel code! Can someone > pls advise what am I doing wrong here? I c

  1   2   >