It seems that this addition works, but has created just one object
called 'peak' with all the data from those 100 files. I'd like each
file to have a corresponding object containing the data.
Thanks for your help!
On Tue, Apr 28, 2009 at 19:43, Zeljko Vrba wrote:
> On Tue, Apr 28, 2009 at 07:0
Thanks!
I found an other, less elegant, way as well. (This always happens, just
after asking someone else)
a<-data.frame(x=c(1:5),y=c(2,2,3,3,4))
require(lattice)
png(filename="let's change the font.png", width=480, height=300,
pointsize=12)
xyplot(y~x,data=a,
ylab=list("y-axis",font=6),
On Tue, Apr 28, 2009 at 07:09:04PM -1000, Taylor Hermes wrote:
>
> I tried the following:
>
Add this before for():
peak <- list()
> for (i in 1:100) {
> peak[[i]] <- read.table(paste(i,"--one--hist.txt", sep=""), sep=",",
> header=TRUE)
> }
>
_
hi,
I am using R's "kernlab" package, exactly i am doing classification using
ksvm(.) and predict.ksvm(.).I want use of custom kernel. I am getting some
error.
# Following R code works (with promotergene dataset):
library("kernlab")
s <- function(x, y) {
sum((x*y)^1.25)
}
class(s) <- "kernel"
I'm trying to import data from 100 text files and create data frames
that reflect their numbering.
The slow way would be to do the following:
peak1 <- read.table("1--peak--hist.txt", sep=",", header=TRUE)
peak2 <- read.table("2--peak--hist.txt", sep=",", header=TRUE)
peak3 <- read.table("3--peak-
G'day Bendix,
On Mon, 27 Apr 2009 22:52:02 +0200
"BXC (Bendix Carstensen)" wrote:
> In version 2.8.1, running Rcmd check on the package foo would leave
> the file foo-manual.tex in the folder foo.Rcheck.
>
> But as of 2.9.0 only foo-manual.pdf and foo-manual.log are there.
>
> Is this intentio
PDXRugger wrote:
I have a procedure that goes sorts out some numbers based on specidifed
criteria and for some reason the list contains double values in some of the
rows such as:
TAZs <-
[[84]]
[1] 638
[[85]]
[1] 643
[[86]]
[1] 644 732
[[87]]
[1] 651 801
i would like to check list TAZs for
It is unclear what you really want so here are two solutions to two
different questions:
> A <- matrix(c(0,1,2,0,1,0,1,2,3,4), ncol=1)
> A
[,1]
[1,]0
[2,]1
[3,]2
[4,]0
[5,]1
[6,]0
[7,]1
[8,]2
[9,]3
[10,]4
> A[A[,1] %in% c(2,1,4) , ]
[1] 1
Hi all,
I have a problem selecting some rows from a random data.
I'd like to select the same rows (before 0) .
For example:
A
[1] 0
[2] 1
[3] 2
[4] 0
[5] 1
[6] 0
[7] 1
[8] 2
[9] 3
[10] 4
I'd like to select the row where a = 2 1 4
I searched on the search of the R site b
I have a procedure that goes sorts out some numbers based on specidifed
criteria and for some reason the list contains double values in some of the
rows such as:
TAZs <-
[[84]]
[1] 638
[[85]]
[1] 643
[[86]]
[1] 644 732
[[87]]
[1] 651 801
i would like to check list TAZs for double values and
I have found Sweave() to be great for producing PDF documents. I have
been experimenting with RweaveHTML (from the R2HTML) package and have
had moderate success. My main issue has been that I simply want the R
output to be shown verbatim in the HTML document but RweaveHTML tends to
convert most o
In the function call in 'apply', you are passed the values in the rows:
> set.seed(30)
> z = matrix(rnorm(10), 5, 2)
> apply(z, 1, function(x) sum(z[x,1]*1, z[x,2]*3))
[1] -0.908321 0.00 0.00 -5.822442 -5.822442
> z
[,1] [,2]
[1,] -1.2885182 -1.5113079
[2,] -0.3476894 0
You are indeed missing something. x is _one row_ of z, not the index
specifying that row. So what you want is:
apply(z, 1, function(x)sum(x[1]*1, x[2]*3))
Thanks for including a reproducible example.
Sarah
On Tue, Apr 28, 2009 at 9:02 PM, megh wrote:
>
> Hi all, can you please clarify me what i
Hi all, can you please clarify me what is the wrong with following codes :
set.seed(30)
z = matrix(rnorm(10), 5, 2)
apply(z, 1, function(x) sum(z[x,1]*1, z[x,2]*3))
However I can not get the desired result. For example, "sum(z[1,1]*1,
z[1,2]*3)" gives -5.822442 which is actually correct. Am I mi
On Apr 28, 2009, at 6:19 PM, x wrote:
Hi all,
Do I need to define limits as the error message seems to suggest?
The error message, my code, the output and the first few lines of my
data are all below.
Thank you!
"Error in Getlim(at, allow.null = TRUE, need.all = TRUE) :
variable dmode
John,
Thank you for the code, it looks like just what's needed. I'll give it a try
tomorrow.
The desire for reference lines is to aid comparisons of different factor
levels, to look at whether confidence intervals overlap. I've attached a
graphic file of the particular allEffects plot, i
Deepayan Sarkar writes:
> On Tue, Apr 28, 2009 at 7:40 AM, tyler wrote:
>> Hi,
>>
>> I'm working on some lattice wireframe figures that have two conditioning
>> factors, and I want the strips labelled on the top and left of the
>> entire plot, rather than above each individual panel. useOuterStr
On 28/04/2009 3:47 PM, ravi wrote:
Hi all,
I want to install the package Rgraphviz on R2.9.0 (after installing Graphviz
2.22). I have not been successful in installing from the binary on a win XP pc.
After looking up previous posts on the R and bioconductor lists, I installed
the Rtools29. I h
On Tue, Apr 28, 2009 at 11:51 AM, Sebastien Bihorel
wrote:
> Dear R-users,
>
> I am trying to understand what the different padding arguments in
> trellis.par.set are exactly controlling the space around lattice plots. I
> have used the following code as a basis for testing but it did not really
>
Does ?system help?
Ranjan
On Tue, 28 Apr 2009 13:00:28 -0700 (PDT) thoeb
wrote:
>
> Hello,
> does anybody know about how to "send" a command or a text line from R to
> another program? I have written a script in which several calculations are
> made and outputfiles (csv) are generated. Afterwa
Hi all,
I want to install the package Rgraphviz on R2.9.0 (after installing Graphviz
2.22). I have not been successful in installing from the binary on a win XP pc.
After looking up previous posts on the R and bioconductor lists, I installed
the Rtools29. I have checked that the paths are corre
On Tue, Apr 28, 2009 at 7:40 AM, tyler wrote:
> Hi,
>
> I'm working on some lattice wireframe figures that have two conditioning
> factors, and I want the strips labelled on the top and left of the
> entire plot, rather than above each individual panel. useOuterStrips()
> does this, but it draws i
Hi all,
Do I need to define limits as the error message seems to suggest? The error
message, my code, the output and the first few lines of my data are all below.
Thank you!
"Error in Getlim(at, allow.null = TRUE, need.all = TRUE) :
variable dmodel.df does not have limits defined in fit or
On Mon, Apr 27, 2009 at 12:33 PM, Daniel Kornhauser
wrote:
> Hi:
>
> I don't know if my explanation below is clear, so afterwards, I wrote a
> small a self contained annotated example that generates two plots.
> I execute simulations with different parameters settings that create several
> dataset
Hi,
Many thanks to Wacek Kusnierczyk and Ted Harding.
I learned 3 new tricks. (Not bad for a newbie?)
$ R --silent --no-save < barebone.R
$ R --quiet --no-save < barebone.R
$ R --slave < barebone.R
With slight differences, they all do what I wanted.
Moving right along my tiny agenda...
The my.symbols function in the TeachingDemos package works here. It was
designed to work like symbols, but with user defined symbols:
library(TeachingDemos)
theta <- seq(0, 2*pi, len=256)
circ <- cbind( cos(theta), sin(theta) )
x <- runif(10)
y <- rnorm(10, 100, 20)
z <- runif(10, .5, 1)
my.s
Dear all,
I have a question about the regression tree function in R.
After applying the tree() function for my data, I found out the
"n" value in the output (the (weighted) number of cases reaching that node) is
always less than my total sample size.
My guess is becasue some of the cases are no
On Mon, Apr 27, 2009 at 12:15 PM, John Poulsen wrote:
> Hello,
>
> I am trying to graph a violin plot like the example in panel.violin(lattice)
> with the singer data - see below
>
> Does anyone know how to change the color of the boxplot on the graph from
> blue to green? I tried a number of cha
Uwe,
I deleted "gregmisc" from by library folder and ran update.packages() again and
I still get the same error:
package 'fBasics' successfully unpacked and MD5 sums checked
Error in unpackPkg(foundpkgs[okp, 2L], foundpkgs[okp, 1L], lib) :
malformed bundle DESCRIPTION file, no Contains field
On Thu, Apr 23, 2009 at 1:23 AM, Rebecca Fisher
wrote:
>
> Dear R users.
> I am wondering what is the simplest way is to generate individual keys for
> each panel in a lattice barchart?
> The help pages said: "To use more than one legend, or to have arbitrary
> legends not constrained by the
> s
On 28-Apr-09 20:42:45, Tena Sakai wrote:
> Hi,
>
> I am a newbie with R. My environment is linux and
> I have a file. I call it barebone.R, which has one
> line:
>
> cat ('Hello World!\n')
>
> I execute this file as:
>
> R --no-save < barebone.R
>
> And it does what I expect. What I get i
On Thu, Apr 23, 2009 at 4:22 AM, Jaakko Nevalainen
wrote:
> Dear R-users:
>
> The following code produces two cones in two panels. What I would like to
> have is to have them in one, and to meet in the origin. Does anyone have any
> good ideas how to do this?
wireframe gets easily confused when n
I think merge() can do what's wanted, but you do have to be careful that values
match exactly. Here's an example where two data frames print the same in a row
for columns 'a' and 'b', but are not exactly same. merge() returns zero rows.
This problem can be fixed in this case by rounding, but
Hi
Here's one way ...
xyplot(y~x,data=a,
ylab="y-axis",
xlab="x-axis",
ylim=c(0,5),
par.settings=list(axis.line=list(lwd=1.5),
strip.border=list(lwd=2),
# This is the important bit
grid.pars=list(fontfamily="mono"
Tena Sakai wrote:
> Hi,
>
> I am a newbie with R. My environment is linux and
> I have a file. I call it barebone.R, which has one
> line:
>
> cat ('Hello World!\n')
>
> I execute this file as:
>
> R --no-save < barebone.R
>
> And it does what I expect. What I get is 20+/- lines
> of text, one
Come on, Dmitri, you could have found it yourself with
help.search("tickmarks") or help.search("axis")
;-)
Bert Gunter
Nonclinical Biostatistics
467-7374
> -Original Message-
> From: r-help-boun...@r-project.org
> [mailto:r-help-boun...@r-project.org] On Behalf Of Dimitri
> Liakhovi
Hi-
I'm trying to make my PCA (princomp) colored. In my csv excel sheet, I have
the first column numbered according to the groupings I want to assign to the
PCA. I've played around with trying to set this first column as the color
vector, but haven't had any luck.
Any suggestions? Thanks,
Hillary
Dear Phil,
thank you so much for refering me to the "axis" function. It helped me
find the solution!
Come on, guys, I was just asking for a pointer, not for a solution.
Dimitri
On Tue, Apr 28, 2009 at 3:37 PM, Phil Spector wrote:
> Dimitri -
> First, suppress the xaxis tick marks by passing
>
>
Hi,
I am a newbie with R. My environment is linux and
I have a file. I call it barebone.R, which has one
line:
cat ('Hello World!\n')
I execute this file as:
R --no-save < barebone.R
And it does what I expect. What I get is 20+/- lines
of text, one of which is 'Hello World!'.
How would I
Hello,
does anybody know about how to "send" a command or a text line from R to
another program? I have written a script in which several calculations are
made and outputfiles (csv) are generated. Afterwards I open another program
(Fortran) via shell.exec. This program asks for the names if the ou
I have updated to R version 2.9. I also have R version 2.7 running on the
same box. I get the following error in R 2.9; the command goes through
without any errors in R 2.7.
Would appreciate any feedback.
Raghu
_
librar
Many thanks.
nobody else of the 20 authors who submitted packages sent a notice.
I guess that puts me in the top 5th percentile of people unafraid of
asking stupid questions.
Matthew Fero
On Apr 28, 2009, at 4:10 AM, Uwe Ligges wrote:
Duncan Murdoch wrote:
On 27/04/2009 8:35 PM,
Dear R-users,
I am trying to understand what the different padding arguments in
trellis.par.set are exactly controlling the space around lattice plots.
I have used the following code as a basis for testing but it did not
really help me to visualize how the value of each argument changes the
m
Dimitri Liakhovitski schrieb:
> I was wondering, if it's possible to "turn off" the default tick marks
> and introduce those tick marks in specific locations.
>
use search. rseek for example. use help. ?axis for example leads you to
an example how to do so... (works also for curve)
and please tr
Dear Paul,
> -Original Message-
> From: Prew, Paul [mailto:paul.p...@ecolab.com]
> Sent: April-28-09 2:19 PM
> To: John Fox; David Winsemius
> Cc: r-help@r-project.org
> Subject: RE: [R] effects package --- add abline to plot
>
> Dear John and David, thank you for your help. I apologize
It is possible in any of the flavors of graphics available in R.
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
--
David
On Apr 28, 2009, at 2:56 PM, Dimitri Liakhovitski wrote:
Hello!
I am usin
Although both are known now, there is a time element involved in
which one, max.loss was fixed at the time of underwriting and loss was
unknown at that time. This *is* an insurance question is it not?
Wouldn't the question be: Can one use the group variable to estimate
the proportion of ma
Hello!
I am using function "curve" to create a line graph.
I was wondering, if it's possible to "turn off" the default tick marks
and introduce those tick marks in specific locations.
For example, currently in my X axis tick marks are (automatically) at
10, 11, 12, 13 but I want them to be in 5 spe
Actually both max.loss and loss are known values (in dollars). I'm very much
doubt, what to choose.
glm(max.loss~loss,family=gaussian(link="identity")
or
glm(formula = sum ~ claims * as.factor(grp), family = gaussian(link =
"identity"))
or
glm(loss~max.loss,family=gaussian(link="identity")
w
Dear John and David, thank you for your help. I apologize for not defining
the analysis as an ordinal regression, or including a structure --- could have
taken some of the guesswork out for you.
John --- for the ticks, I would still like to make this work for future
analyses, but still not su
I think you are off-track because max.loss does not sound like a
proper Y variable. Because max.loss is an amount that is known, in the
insurance applications I have seen it would have been modeled within
an offset term. Many of the examples have used number of ships or
buildings or the per
Thanks, Uwe. It seems that the filesystem did not have enough inodes.
Mark Lyman
-Original Message-
From: Uwe Ligges [mailto:lig...@statistik.tu-dortmund.de]
Sent: Tuesday, April 28, 2009 5:58 AM
To: Lyman, Mark
Cc: r-help@r-project.org
Subject: Re: [R] FW: Install of R 2.9.0
Lyman,
On Tue, 28 Apr 2009, Jamie.lannister wrote:
Hi I'm a mac user. I have problems loading data from mac excel in R.
I'm using these script:
library(utils)
data2 <- read.table(file("clipboard"), header =T, sep ="\t")
but this is the message that I have from R_
Error in open.connection(fil
Hello,
On Mac OS X, certain Aqua/Quartz UI functionality requires an
application to be launched from within an app bundle, or
(alternatively) requires a Carbon application with a resource fork.
Playing with the wxWidgets distribution, I discovered that it is quite
easy and transparent to make suc
Glad we know where the problem lies now.
Dimitri
On Tue, Apr 28, 2009 at 11:55 AM, Terry Therneau wrote:
> It is likely a problem with survival, since
> 2.9 merged in a large number of changes that had occured in my source
> tree that had not propogated to the R tree
>
> my test su
Jamie,
Try it as:
data2 <- read.table(pipe('pbpaste'), header = T)
I have a read.clipboard() function defined in ~/.Rprofile:
read.clipboard <- function(){read.table(pipe('pbpaste'), header = T)}
Also see the "Clipboard" section of ?pipe.
Cheers,
Kevin
Thanks for sending that, Ben. I have incorporated a slightly modified
version, with attribution, in the lme4 sources.
On Tue, Apr 28, 2009 at 8:03 AM, Ben Bolker wrote:
> I think the following works, but use with caution -- I just
> wrote it last night.
>
> setMethod("refit", signature(object =
OK, here we go. I am trying to attach a data file "test.data.txt")
Below is the script:
sample.data<-read.delim(file="test.data.txt")
(dim(sample.data))
(names(sample.data))
names(sample.data)<-c("time","ID","Choice","V1","V2","Set","id")
sample.data$V1<-as.factor(sample.data$V1)
sample.data$V2<-
Dear Colleagues:
Martin's reply provides an appropriate response, so nothing to add. But my
questions dig deeper: Why do so many (presumably nonstatisticians, but ?)
belong to this R^2 religion? Is it because:
1) This is what they are taught in their Stat 101 courses by statisticians?
2) ... by "
Hi I'm a mac user. I have problems loading data from mac excel in R.
I'm using these script:
>library(utils)
>data2 <- read.table(file("clipboard"), header =T, sep ="\t")
but this is the message that I have from R_
Error in open.connection(file, "r") : cannot open the connection
In additio
Hi
I got a dataset
loss max.loss grp
1 10 50 2
2 15 33 1
3 18 49 2
4 33 38 1
5 8 50 3
6 19 29 1
7 22 51 4
8 50 50
Apologies; my earlier reply preceded this extra info.
If you are reading a large file with duplicate "row names", try reading
it in as is, then simply converting the numeric parts to a matrix.
For example, if you had the same kind of data frame as before
x1 <- rnorm(11,5,1)
x2 <- runif(11,0,1)
na
How do you create a "geodata" object
with borders information (such as in
the built-in data set, ca20)? I've looked
at the documentation for as.geodata
but do not see instructions on how to
do this.
Thank you.
-- Laura
***
Laura Chihara
Professor of Math
Clearly, you can specify the 'extra' row names as you had already specified
the duplicate names:
x1 <- rnorm(10,5,1)
x2 <- runif(10,0,1)
nam1 <- paste("A",1:4,sep=".")
nam2 <- paste("A",6:9,sep=".")
nam <- c(nam1,"A.4a",nam2,"A.9a")
mydata <- data.frame(x1,x2)
rownames(mydata) <- nam
But you sh
On 4/28/09, am...@xs4all.nl wrote:
> How would I paste factors c1...c10 to one grouping factor?
>
> Can you give an example?
In this case interaction would be conceptually more appropriate
histogram(~Oversized | with(dat, interaction(c1, c2, c5, c6, c7, c8, c9, c10)),
nint=21,layout=c
The issue isn't really about which order you supply the models to `anova'. The
problem is that there is no meaningful test to perform with these two models,
because the `larger' model has actually been estimated as having a *larger*
deviance than the `smaller' model, so there is never going to
Hi!
mathallan wrote:
> How can I from the summary function, decide which glm (fit1, fit2 or fit3)
> fits to data best? I don't know what to look after, so I would please
> explain the important output.
Start with the AIC value (Akaike Information Criterion). The model
having the lowest AIC is the
It is likely a problem with survival, since
2.9 merged in a large number of changes that had occured in my source
tree that had not propogated to the R tree
my test suite doesn't have a test for this particular case (2 factors)
and - Murphy's law applies:
My Linux installation of R is x86_64-redhat-linux-gnu-library
When I tried to write a tiff file the system responded that tiff was not
supported with this version.
Which version of R on a linux environment does support tiff graphic files ?
Thank you
Steve
Steve Friedman Ph. D.
Spatial Stati
Dear David,
> -Original Message-
> From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] On
> Behalf Of David Winsemius
> Sent: April-28-09 10:12 AM
> To: Prew, Paul
> Cc: r-help@r-project.org
> Subject: Re: [R] effects package --- add abline to plot
>
>
> On Apr 28, 2
> "BN" == Benedikt Niesterok
> on Tue, 28 Apr 2009 15:33:02 +0200 writes:
BN> Hello,
BN> I would like to get a correlation coefficient (R-squared) for my model.
{{ arrrgh... how many people think they "need" an R^2 when they
fit a model ?? }}
BN> I don't kno
Hi, Simon,
I am using mgcv:gam and the version number is mgcv_1.5-2. I also exchanged
the order of two models in
anova, but this also did not help.
>From the differences in DF(0.77246) and deviance (-0.02), these two models
seem to be not significantly different. Isn't it?
Thank you anyway!
Simo
How can I from the summary function, decide which glm (fit1, fit2 or fit3)
fits to data best? I don't know what to look after, so I would please
explain the important output.
> fit1 <- glm(Y~X, family=gaussian(link="identity"))
> fit2 <- glm(Y~X, family=gaussian(link="log"))
> fit3 <- glm(Y~X, fa
Hi, Dieter,
I did add (test="F") in my script, but it does not matter. The following is
my whole script.
#
modelsurs_fer13<-gam(sum_surv15~s(FLBS)+SES+s(byear)+s(FLBS,byear),family=quasipoisson)
modelsurs_fer14<-gam(sum_surv15~s(FLBS
Thanks Uwe,
Your strata suggestion works, thank you, but it has created a dataset of random
rows but without the data, other columns involved. You see I would further like
to use this random sample for a DFA (lda) analysis. Can you suggest how I would
use the strata function to sample a subse
Hello dear R users,
My objective is to change the size of this graphic : plot(lm(a~b), 4)
(Cook's distance)
I have found the help on the internet saying to change the size of a title
on a graphic plot(lm(a ~ b), 4), I should use the graphic parameter
cex.caption
http://stat.ethz.ch/R-manual/R-p
Thanks for your quickly answer. I feel embarrassed but I didn't understand
it.
1 - diag(table) / sum(table)Which diagonal? Both of them?
Could you explain it to me with a practical example?
CONFUSION MATRIX
Observed Class
Predicted Class A
I have identified the outlier of the time series "duration of conversation in
minutes" of the telephone traffic to an operator, through residuals
analysis.I must provide an estimate of the abnormality and I thought to
consider the value of the residual and multiply by the coefficient of
variation
I put savehistory() in my profile file, and it works nicely.
Thank you very much, jdeisenberg.
alex
jdeisenberg wrote:
>
>
> alex lee wrote:
>>
>> Is there any options that I can save history only?
>> The only save option is --save, which saves both data and history.
>> However I want to res
Richardson, Patrick wrote:
Hi Uwe,
I was able to reinstall every package you suggested except for "gregmisc" (see
below)
package 'gregmisc' successfully unpacked and MD5 sums checked
Error in unpackPkg(foundpkgs[okp, 2L], foundpkgs[okp, 1L], lib) :
malformed bundle DESCRIPTION file, no Co
Hi all,
I'm having some trouble in understanding how to ste the Error() term in
the aov() function when fitting a hierarchical ANOVA.
I have data concerning the expression of 2 miRNAs in 3 different cell
lines, with 2 different extraction methods. The data is organized as
follows :
Line
I am trying to run a partialPlot with Random Forest (as I have done many times
before).
First I run my forest... Cell is a 6 level factor that is the dependent
variable - all other variables are predictors, most of these are factors as
well.
predCell<-randomForest(x=tempdata[-match("Cell",name
Cecilia Lezama wrote:
Thanks for your quickly answer. I feel embarrassed but I didn't
understand it.
1 - diag(table) / sum(table)Which diagonal? Both of them?
Could you explain it to me with a practical example?
Whoops, this meant to be
1 - sum(diag(table)) / sum(table)
i.e. 1 -
Rachel Taylor-2 wrote:
>
>
> Hi all,
>
> I am trying to generate a series of random numbers. What I want to do is
> create n random Poisson numbers (easily done with the rpois function) and
> then use those generated numbers as the number of genenerated from another
> distribution (in this
Hi,
I'm working on some lattice wireframe figures that have two conditioning
factors, and I want the strips labelled on the top and left of the
entire plot, rather than above each individual panel. useOuterStrips()
does this, but it draws internal axis lines, even after I explicitly set
axis.line
On 4/28/2009 10:06 AM, Colin Beale wrote:
Hi,
I'm trying to make sense of the image3d plots in misc3d. Unfortunately I can't find any authors on the help pages of the function to e-mail directly. In the following toy example, I'm puzzled as to why (1) the positions of the image plot on the axes
Hi Uwe,
I was able to reinstall every package you suggested except for "gregmisc" (see
below)
package 'gregmisc' successfully unpacked and MD5 sums checked
Error in unpackPkg(foundpkgs[okp, 2L], foundpkgs[okp, 1L], lib) :
malformed bundle DESCRIPTION file, no Contains field
I've again tried
How would I paste factors c1...c10 to one grouping factor?
Can you give an example?
Thanks much!
Alex
> xs4all.nl> writes:
>
>>
>> I have 8 cofactors possibly affecting one and only one variable.
>>
>> I make conditional histograms:
>>
>> <-pdf(file="tst3.pdf",paper="special",width=36,height=
That was very helpful. Using the predict.all option I got exactly what I
need. Is there any way of visualizing the predictions? using MDS plot is the
best way?
Also, I want to run random Forest using three different schemes (e.g.
training set 70% and test se 30%, cross validation with k=10, etc).
Hi
r-help-boun...@r-project.org napsal dne 28.04.2009 15:09:55:
> Thanks, I can't use the name as a variable because I need to create a
matrix
> which does include only numerical values!
If you are 100% sure about dimensions let your numeric matrix be without
row names and put names into sepa
Hi,
I'm trying to make sense of the image3d plots in misc3d. Unfortunately I can't
find any authors on the help pages of the function to e-mail directly. In the
following toy example, I'm puzzled as to why (1) the positions of the image
plot on the axes include negative values when I think I've
On Apr 28, 2009, at 12:00 AM, Prew, Paul wrote:
Hello, I am not having success in a simple task. Using the effects
package, I would like to add reference lines at probability values
of 0.1 – 0.6 on a plot of the effects.
I have concerns that you are considering these probabilities. They
Hi
r-help-boun...@r-project.org napsal dne 28.04.2009 15:04:01:
>
> My data contains a variable "observation_date" and it contains values
as:
>
> 1985-09-02
> 1985-09-15
> 1985-07-31
> 1985-09-02
>
>
> I need to process data annually rather than daily, therefore I'm trying
to
> 1) either e
Gabor,
These options will work just fine. Thank you
Steve
Steve Friedman Ph. D.
Spatial Statistical Analyst
Everglades and Dry Tortugas National Park
950 N Krome Ave (3rd Floor)
Homestead, Florida 33034
steve_fried...@nps.gov
Office (305) 224 - 4282
Fax (305) 224 - 4147
Why do you post more than once?
I have answered your former (almost) identical message minutes ago.
Best,
Uwe Ligges
Richardson, Patrick wrote:
When trying to update (various) packages using update.packages() I get the
following error message for various packages
package 'fBasics' success
Hi all,
I am trying to generate a series of random numbers. What I want to do is
create n random Poisson numbers (easily done with the rpois function) and then
use those generated numbers as the number of genenerated from another
distribution (in this case, a function for the bounded Pareto
willow1980 wrote:
>
> Hi, Dieter,
> I did add (test="F") in my script, but it does not matter. The following
> is my whole script.
>
> #
> modelsurs_fer13<-gam(sum_surv15~s(FLBS)+SES+s(byear)+s(FLBS,byear),family=quasipoisson)
> m
Richardson, Patrick wrote:
When trying to update (various) packages using update.packages() I get the
following error message for various packages
package 'fBasics' successfully unpacked and MD5 sums checked
Error in unpackPkg(foundpkgs[okp, 2L], foundpkgs[okp, 1L], lib) :
malformed bundle
Is there any other way to illustrate the overlap of subsets' distribution (not
necessarily by an estimation plot but by a plot of true values)?
--- On Tue, 4/28/09, Uwe Ligges wrote:
From: Uwe Ligges
Subject: Re: [R] truehist and density plots
To: wht_...@yahoo.com
Cc: r-h...@stat.math.ethz.ch
xs4all.nl> writes:
>
> I have 8 cofactors possibly affecting one and only one variable.
>
> I make conditional histograms:
>
> <-pdf(file="tst3.pdf",paper="special",width=36,height=36)
>
<-histogram(~Oversized|dat$c1*dat$c2*dat$c5*dat$c6*dat$c7*dat$c8*
dat$c9*dat$c10,nint=21,layout=c(32,8),
1 - 100 of 190 matches
Mail list logo