In-Sun,
It is very simple. You define your state variables in the following order:
y <- c(Agi = 0,Alu = 0, Abr = 0, Ah = 0, Ali = 0, Ak = 0, Am = 0, Ask =
0, Aad = 0, Apa = 0, Asp = 0, Aar = 0, Ave = 0)
and your rates of change in another order:
dy = c(dAar, dAve, dAlu, dAli, dAbr,
Hi the list,
I am writing a function (myFunc) that is using an other function (let
say distance).
+++
dist1 <- function(x,y)dist(rbind(x,y))
dist2 <- function(x,y)y2
myFunc <- function(x,distance){
cat("...\n")
cat(distance(1,x))
}
myFunc(x=3,distance=dist1)
myFunc(x=3,distance=
Hi Alon,
It works for me.
According to YAST I got libgfortran4.3, gcc-43fortran and gcc-fortran
installed
Kees
Marc Schwartz wrote:
> On Jun 11, 2009, at 12:34 PM, Alon Ben-Ari wrote:
>
>> Hello, I have openSUSE 11.1
>> Trying to install randomForest
>> as SU after invoking R install.packages("ra
Paul Murrell wrote:
Hi
The bug is now fixed in the development version
(thanks to Duncan for the diagnosis and suggested fix).
Paul
Thank you both for your help and dedication!
Best regards,
baptiste
--
_
Baptiste Auguié
School of Physics
University of Exe
Is there an easy way to override the compile options when installing
packages from CRAN on Unix-style systems? I tried setting CFLAGS,
CXXFLAGS, and FFLAGS but they are not picked up.
For example (with a random package and adding -mtune only to try to get
rid of the default)
export CFLAGS="
Hello R users,
i'm wondering how to trigger variable creation.
Whenever a variable is created i want my own function myFun(...) to be
started.
if (exists("x")) {rm(x)} # after removal of x
# any of these calls
x<-10# should call myFun
x=10
Jason Rupert wrote:
Just read the following:
https://stat.ethz.ch/pipermail/r-help/2003-October/039940.html
Is the labcurve function, really the putKey function, in the Hmisc package the
best way the to go about automatically placing legend in location of most
whitespace?
Hi Jason,
I wasn
Hi all,
first of all: Sorry for my bad englis, and now the Question:
I have some problems with running R from Java. First i tried using rJava (JRI).
But the examples didnt work properly.
Now im trying to establish a connection by using Rserve and JRclient (RF503).
I have the following code, wh
Hi R-specialists!
I would like to draw some hyperbolic (iso-)lines of a cost function in a
bi-dimensional space ( =shapes of a cost function ), based on (the
general form):
C(x) = c1*Ce + c2*Oe + c3*{ 1 - [ (1 - Ce)^a * (1 - Oe)^b ] }
where:
- Oe/Ce are Omission/Commission (ranging between 0 an
Dear R users,
Does anybody have a function to calculate logLik or AIC for nlsList objects?
After receiving error messages, another user helped me ascertain that this
function is not currently written into R.
Many thanks
Lindsay
__
R-help@r-project.or
Hi all,
first of all: Sorry for my bad englis, and now the Question:
I have some problems with running R from Java. First i tried using rJava (JRI).
But the examples didnt work properly.
Now im trying to establish a connection by using Rserve and JRclient (RF503).
I have the following code, wh
Hi there,
I am looking to compare nonlinear mixed effects models that have different
nonlinear functions (different types of growth curve)embedded. Most of the
literature I can find focuses on comparing nested models with likelihood ratios
and AIC. Is there a way to compare model fits when mode
Hello
I have a dataset in which I would like to replace 0s with NAs. There is a
lot of information on how to replace NAs with 0, but I have struggled to
find anything with regards to doing the reverse. Any recommendations would
be great.
Cheers
Christine
On 6/12/2009 4:55 AM, Christine Griffiths wrote:
> Hello
>
> I have a dataset in which I would like to replace 0s with NAs. There is
> a lot of information on how to replace NAs with 0, but I have struggled
> to find anything with regards to doing the reverse. Any recommendations
> would be great.
something like ...
> x<-c(1,2,3,0,5,6,0)
> is.na(x[x==0])<-T
> x
[1] 1 2 3 NA 5 6 NA
Robert Kinley
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailma
On 11/06/09 22:46, ALAN SMITH wrote:
Hello R users and developers,
I would like to install Rmpi so that I may take advantage of all of
the CPUs in my computer
Package "multicore" *may* be easier for this.
, but I cannot get it to install [...]
The configuration file for Rmpi is, unfortunately,
On Fri, 2009-06-12 at 09:55 +0100, Christine Griffiths wrote:
> Hello
>
> I have a dataset in which I would like to replace 0s with NAs. There is a
> lot of information on how to replace NAs with 0, but I have struggled to
> find anything with regards to doing the reverse. Any recommendations wo
Also try this:
X[X == 0] <- NA
or
X2 <- replace(X, X == 0, NA)
On Fri, Jun 12, 2009 at 5:54 AM, Chuck Cleland wrote:
> On 6/12/2009 4:55 AM, Christine Griffiths wrote:
>> Hello
>>
>> I have a dataset in which I would like to replace 0s with NAs. There is
>> a lot of information on how to repla
On Fri, 12 Jun 2009, Allan Engelhardt wrote:
Is there an easy way to override the compile options when installing packages
from CRAN on Unix-style systems? I tried setting CFLAGS, CXXFLAGS, and
FFLAGS but they are not picked up.
For example (with a random package and adding -mtune only to tr
On 11/06/2009 5:35 PM, Stavros Macrakis wrote:
A table without names displays like a vector:
> unname(table(2:3))
[1] 1 1 1
and preserves the table class (as with unname in general):
> dput(unname(table(2:3)))
structure(c(1L, 1L), .Dim = 2L, class = "table")
Does that make sen
Other method:
a<-matrix(seq(1,20,2), 4,5)
a[c(1:2),c(2:4)]<-0
a[a==0]<-NA
- Original Message -
From: "Robert Kinley"
To:
Sent: Friday, June 12, 2009 11:59 AM
Subject: [R] replacing zeros by NAs
something like ...
x<-c(1,2,3,0,5,6,0)
is.na(x[x==0])<-T
x
[1] 1 2 3 NA 5 6 NA
Lindsay Banin wrote
>Hi there,
>
>I am looking to compare nonlinear mixed effects models that have different
>nonlinear functions (different types of growth curve)embedded. Most of the
>literature I can find focuses on comparing nested models with likelihood
>ratios and AIC. Is there a way to c
For future reference, I put up the instructions here:
http://www.cybaea.net/Blogs/Data/R-tips-Installing-Rmpi-on-Fedora-Linux.html
Allan
On 12/06/09 10:59, Allan Engelhardt wrote:
On 11/06/09 22:46, ALAN SMITH wrote:
Hello R users and developers,
I would like to install Rmpi so that I may ta
On Thu, Jun 11, 2009 at 9:56 PM, Brecknock, Peter wrote:
> Apologies if this is not the correct list for this question.
>
> The Rglpk package offers the following example in its documentation
>
> library(Rglpk)
> ## Simple mixed integer linear program.
> ## maximize: 3 x_1 + 1 x_2 + 3 x_3
> ## subj
loris.benn...@fu-berlin.de (Loris Bennett) writes:
> Hi,
>
> I am trying to install R 2.9.0 on AIX 5.3. During the 'make' run I get
> the following error:
>
>Error: Invalid DESCRIPTION file
>
>Invalid Priority field.
>Packages with priorities 'base' or 'recommended' or 'defunct-base' m
Chunhao Tu wrote
>Hi R users,
>My question is, If I have 3 groups, A, B, C and I know mean of A =20, B=21,
>and C=20.5 and I also know the
>standard error of A =1.1, B=2.2, C=3.2. Plus, I know A has 30 observations,
>B has 78, C has 45. But I do not have the raw data.
>
>Can I use pairwise.t.tes
Perhaps reading ?readRAST6 would help? It does say:
vname: A vector of GRASS 6.0 raster file names
so you could write:
Kar <- readRAST6(c("Incis_Kar", "DEM_Kar"), plugin=FALSE)
and plot(Incis_Kar ~ DEM_Kar, data=Kar) should get you there - in spearfish:
sp <- readRAST6(c("erosion1", "elevat
Arg, I already needed to fix the bundle. If anyone downloaded it
yesterday, please update, the help index building was broken (on
Macs). Should work now.
Repo/Infos: http://github.com/swissr/rmate.tmbundle/tree/master
--
Regards,
Hans-Peter
__
R-help@
Try this also:
is.na(x) <- x == 0
On Fri, Jun 12, 2009 at 6:59 AM, Robert Kinley wrote:
> something like ...
>
> > x<-c(1,2,3,0,5,6,0)
> > is.na(x[x==0])<-T
> > x
> [1] 1 2 3 NA 5 6 NA
>
>
> Robert Kinley
>
>
>
>
>[[alternative HTML version delete
I have a dataset with four different treatments and two different values
for each sample. I need to compare the subsets(the different treatments)
somehow. The data look suspiciously much like some kind of e-function to
me, or maybe michaelis-menten so they are not linear. With linear models
it's st
Hi,
A fairly basic problem I think, here although searching the inetrnet doesn't
seem to reveal a solution. I have a dataset with two columns of real
numbers. It is read in via read.table. I simply need to square the data in
the second column and then plot it. I have tried extracting the second
c
Dear all,
I have a problem for multinomial logistic regression: the response
variable is multinomial (score 1-5) and the two predictors are
categorical; all that comes from panelists (it's a kind of preference
study), which I treat as a block and include in the model (is it
correct?). I would like
Have sorted it, it was simple, for anyone else who needs it:
z[2] <- z[2]*z[2]
squares the second column of a data table and writes it back to the second
column
Kenny
Kenny Larsen wrote:
>
> Hi,
>
> A fairly basic problem I think, here although searching the inetrnet
> doesn't seem to reve
Kenny Larsen wrote:
Hi,
A fairly basic problem I think, here although searching the inetrnet doesn't
seem to reveal a solution. I have a dataset with two columns of real
numbers. It is read in via read.table. I simply need to square the data in
the second column and then plot it. I have tried ex
I'm trying to plot a graph where the axes go through 0,0, rather than around
it combined with a box round the graph, so
x<-0:10;y<-0:10
plot(x,y)
gives me a box but doesn't go through the point 0,0, but stays at a
distance.
In trying to circumvent this problem, I wrote
plot(x,y)
axis(1, pos=
Dear list
The deSolve package allows you to specify the model code in C or Fortran.
Thanks to the excellent vignette this works fine. However I have not yet
managed to use forcing functions in C code.
In pure R code this works very well with approxfun() specified outside the
model:
#
On Jun 12, 2009, at 7:18 AM, Paul Chatfield wrote:
I'm trying to plot a graph where the axes go through 0,0, rather
than around
it combined with a box round the graph, so
x<-0:10;y<-0:10
plot(x,y)
gives me a box but doesn't go through the point 0,0, but stays at a
distance.
In trying to
> "DM" == Duncan Murdoch
> on Fri, 12 Jun 2009 06:09:14 -0400 writes:
DM> On 11/06/2009 5:35 PM, Stavros Macrakis wrote:
>> A table without names displays like a vector:
>>
>> > unname(table(2:3)) [1] 1 1 1
>>
>> and preserves the table class (as with unname
Hi all,
I've been trying to work out how to slice an array of arbitrary
dimension. I found a message showing how to stick two arrays together,
but so far have been unable to transform that into what I need. Assume
that I have a four dimensional array for example:
array4d
, , 1, 1
[,1] [,
Hi all,
Is there a cross-platform way to do this? On the mac, I cando this by
saving an eps file, and then using pbcopy. Is it possible on other
platforms?
Hadley
--
http://had.co.nz/
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman
Lindsay Banin wrote:
>
> Dear R users,
>
> Does anybody have a function to calculate logLik or AIC for nlsList
> objects? After receiving error messages, another user helped me ascertain
> that this function is not currently written into R.
>
how about:
library(nlme)
example(nlsList)
sapply
Hi R list,
I would like to automate, or speed up the process from which I take
several separate datasets, stored in .csv formate, import and merge
them by a common variable. So far I have greatly sped up the loading
process but cannot think of a way to automate the merger of all
da
well,
for sure, one option is to trace the garbage collector gc() by a
function that enumerates the list of known objects and compares this
with its successor. But that's not reliable, as i can't really control
when to call the garbage collector. i also don't like to enumerate
objects and to c
The "1L", etc., forces the number to be integer:
> is.integer(1)
[1] FALSE
> is.integer(1L)
[1] TRUE
Hope this helps.
Spencer
Paul Smith wrote:
On Thu, Jun 11, 2009 at 9:56 PM, Brecknock, Peter wrote:
Apologies if this is not the correct list for this question.
The Rglpk pac
Dear John,
I have a question.
When I run a RGtk code in my terminal (without using the R GUI)
R --vanilla << "EOF"
source("myRGtkcode.R")
EOF
the GTK objects do not remain on the screen.
Until now, I "bypass" this problem using the following commands:
require(tcltk)
tkmessageBox("Press to exi
You may have more luck with the triangle plot functions available in other R
libraries. In addition to triangle.plot in ade4, you have other options
(this may not be an exhaustive list):
plot.acomp in compositions
tri in cwhmisc.cwhtool
triax in plotrix
ternary in StatDA
ternaryplot in vcd
ternary
I am just beginning to use Sweave with Lyx on a Mac (R2.8.1). I have
12 chunks of Sweave code that work fine, but this piece:
<<>>=
library(car)
cabbages$Year<-recode(cabbages$Year,"'X2001'='2001';'X2002'='2002';'X2003'='2003';'X2004'='2004';'X2005'='2005';'X2006'='2006';'X2007'='2007';'X2008'='20
Hi all,
I am using glm function with family binomial(logit) to fit logistic
regression model. My data is very big and the algorithm is such that it
has to run glm function hundreds of times. Now *I need only the
**estimates of the coefficients and std. error in my output, *but
apparently glm
See the abind package.
On Fri, Jun 12, 2009 at 8:36 AM, Jim Lemon wrote:
> Hi all,
> I've been trying to work out how to slice an array of arbitrary dimension. I
> found a message showing how to stick two arrays together, but so far have
> been unable to transform that into what I need. Assume tha
Suppose I have the first vector: c(1, 6, 8, 9)
I will like to create a second vector of size 10 composed of 0 and 1's. The
second vector will be composed of four 1's and six 0's. The position of the
1's will be specificed by the first vector. So essentially, I want a second
vector in the form:
c
I'm fairly new to R, and I'm trying to write out a population model that
satisfies the following;
the system consists of s species, i= 1, 2,...,s
network of interactions between species is specified by a (s x s) real matrix,
C[i,j]
x[i] being the relative population of the "ith" species (0 =< x
njhuang86 wrote:
>
> Suppose I have the first vector: c(1, 6, 8, 9)
>
> I will like to create a second vector of size 10 composed of 0 and 1's.
> The second vector will be composed of four 1's and six 0's. The position
> of the 1's will be specificed by the first vector. So essentially, I want
Try this:
x <- c(1, 6, 8, 9)
tabulate(x, nbins = max(x) + 1)
On Fri, Jun 12, 2009 at 11:45 AM, njhuang86 wrote:
>
> Suppose I have the first vector: c(1, 6, 8, 9)
>
> I will like to create a second vector of size 10 composed of 0 and 1's. The
> second vector will be composed of four 1's and six
try this
> a<-c(1, 6, 8, 9)
> 1*(1:10 %in% a)
[1] 1 0 0 0 0 1 0 1 1 0
Stefano
-Messaggio originale-
Da: r-help-boun...@r-project.org
[mailto:r-help-boun...@r-project.org]per conto di njhuang86
Inviato: Friday, June 12, 2009 4:45 PM
A: r-help@r-project.org
Oggetto: [R] Creating this v
On Fri, Jun 12, 2009 at 6:09 AM, Duncan Murdoch wrote:
> On 11/06/2009 5:35 PM, Stavros Macrakis wrote:
>
>> A table without names displays like a vector:
>>
>>> unname(table(2:3))
>>[1] 1 1 1
>>
>> and preserves the table class (as with unname in general):
>>
>>> dput(unname(table(2:3
Jim,
Is
do.call( '[', list( array4d,TRUE,TRUE,TRUE,1 ) )
what you want?
HTH,
Chuck
On Fri, 12 Jun 2009, Jim Lemon wrote:
Hi all,
I've been trying to work out how to slice an array of arbitrary dimension. I
found a message showing how to stick two arrays together, but so far hav
On Fri, Jun 12, 2009 at 10:57 AM, Stavros Macrakis wrote:
> On Fri, Jun 12, 2009 at 6:09 AM, Duncan Murdoch wrote:
>
>> On 11/06/2009 5:35 PM, Stavros Macrakis wrote:
>>
>>> A table without names displays like a vector:
>>>
>>> > unname(table(2:3))
>>> [1] 1 1 1
>>>
>>> and preserves the tabl
On Jun 12, 2009, at 10:13 AM, David Carlson wrote:
You may have more luck with the triangle plot functions available in
other R
libraries. In addition to triangle.plot in ade4, you have other
options
(this may not be an exhaustive list):
plot.acomp in compositions
tri in cwhmisc.cwhtool
tr
Quantide is pleased to announce the above course in Milan:
--
Introduction to the R language
6-7th July 2009
Milano Italy
--
* Who Should Attend ?
Th
I am trying to find studentized bootstrap intervals for the skewness of a data
set. I have tried the following (nerve.dat is a set of data containing
observations on one variable) (using Windows XP):
x <- scan("e:/Flashbackup2009/Nonparametrics/nerve.dat")
n <- length(x)
library(e1071)
skewness(
Dear Graham,
I just tried a similar recode() command using Sweave on a Windows system
(not through LyX) and it worked fine.
I hope this helps,
John
> -Original Message-
> From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org]
On
> Behalf Of Graham Smith
> Sent: June-12
See if this works for you:
# read into a list and then rbind to single data frame
input <- do.call(rbind, lapply(files, function(.file){
X <- read.csv(.file)
X$label <- gsub('.csv$', '', .file) # add name
X
}))
# use the reshape package
require(reshape)
i.melt <- melt(input, id=c("lab
I think the last should be:
output <- cast(i.melt, Item_name ~ label, sum)
On Fri, Jun 12, 2009 at 9:27 AM, Jon Loehrke wrote:
> Hi R list,
>I would like to automate, or speed up the process from which I take
> several separate datasets, stored in .csv formate, import and merge
> the
The help page ?boot.ci says
Variance estimates are required for studentized intervals.
(and the warning you got repeated the point).
Package 'boot' is support software for a book by Davison & Hinkley
which explains how to used boot.ci() for studentized
John,
Thanks, its difficult when you don't know where the problem is. The
code works fine directly in R on the Mac, and from whta you say it
works with Sweave, so it seems to narrow it down to Lyx/Sweave/Mac
interaction.
Graham
2009/6/12 John Fox :
> Dear Graham,
>
> I just tried a similar recod
At 05:42 AM 6/12/2009, Lindsay Banin wrote:
Hi there,
I am looking to compare nonlinear mixed effects models that have
different nonlinear functions (different types of growth
curve)embedded. Most of the literature I can find focuses on
comparing nested models with likelihood ratios and AIC.
Hello R users
I am looking for a package to visualize "relatively
planar" directed graphs, with say 100 nodes and
specified using an adjacency list.
'Rgraphviz', currently listed on the R-FAQ, seemed
suitable (FAQ version 2.9.2009-06-05)
But when I looked for the package, I found it had been
re
Robbie Morrison wrote:
> Hello R users
>
> I am looking for a package to visualize "relatively
> planar" directed graphs, with say 100 nodes and
> specified using an adjacency list.
>
> 'Rgraphviz', currently listed on the R-FAQ, seemed
> suitable (FAQ version 2.9.2009-06-05)
>
> But when I look
Dear all,
do you know if it's available and where the "FBI Homicide" dataset?
It has at least the following columns: "victim age", "homicide age".
A scatterplot of this data is visible here:
http://www.uml.edu/gallery/main.php?g2_itemId=6016
Thanks for your help!
m
I'm wondering if I am dealing with a limitation in lattice. It's
probably due to my own limitations though.
I'm working with a lattice dotplot. The x-axis is set at "free". In
one panel, there are only two data points that have equal x-axis values.
Since no range exists, lattice isn't plottin
Just to follow this up. Changing the document encoding in Lyx from the
default (whatever that was) to utf8 (with some help from Jay) allowed
some sample"recode" code to run (it wouldn't run initially), but my
original code still won't run.
Strangely looking at the Latex code window in Lyx shows
Can anyone send me the R code for fitting a mixture of normal distributions.
Or in fact any'combination' of mixtures of distributions. I looke dta mix
but it is still not clear to me.
Jim
[[alternative HTML version deleted]]
__
R-help@r-projec
The package mixtools appears a more appropriate place to look.
On Jun 12, 2009, at 2:57 PM, Jim Silverton wrote:
Can anyone send me the R code for fitting a mixture of normal
distributions.
Or in fact any'combination' of mixtures of distributions. I looke
dta mix
but it is still not clear
While this is a bit embarrassing , it seems I had two problems, one
was that the recode command seems to need utf8 coding rather than the
Lyx default (which is fine), plus I had typing error in the data set,
which is not fine :-(.
I rewrote my code using the with command which allowed it to run, b
On Jun 12, 2009, at 3:13 PM, David Winsemius wrote:
The package mixtools appears a more appropriate place to look.
... as well as: http://cran.r-project.org/web/views/Cluster.html
On Jun 12, 2009, at 2:57 PM, Jim Silverton wrote:
Can anyone send me the R code for fitting a mixture of no
Hello,
I am trying to use Sweave to write up a report, and I have used the
plm package to do some panel models. I am trying to use xtable to make
a nice table for my regression objects (returned by the plm command),
but I am getting the error:
Error in UseMethod("xtable") : no applicable method fo
for the function funnelplot(), how do I include 95% confidence intervals for
the effect estimate ( ie. / \ )?
--
View this message in context:
http://www.nabble.com/funnel-plots-tp24003106p24003106.html
Sent from the R help mailing list archive at Nabble.com.
___
Hi listers,
I have a data frame with 5 variables... And I want reorder the data frame
according a specific variable X...
I checked the sort and order functions... In my case I think that the ORDER
function is applicable... But I did not understand at all... The idea is
simple... Data order by X...
The concept behind
http://themarketinganalysts.com/en/pages/market-basket-analysis/ Market
Basket Analysis is relatively simple but it requires a huge server and lots
of processing power. If you run into problems and need to run your data on
larger machine, please keep us in mind. We would be
.. and package mixdist.
Google on "R mixture models" or similar.
Bert Gunter
Genentech Nonclinical Biostatistics
-Original Message-
From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] On
Behalf Of David Winsemius
Sent: Friday, June 12, 2009 12:14 PM
To: Jim Silverto
On Fri, 12 Jun 2009, Stephen J. Barr wrote:
Hello,
I am trying to use Sweave to write up a report, and I have used the
plm package to do some panel models. I am trying to use xtable to make
a nice table for my regression objects (returned by the plm command),
but I am getting the error:
Error i
Try this:
DF <- data.frame(ID = sample(5), v = rnorm(5))
DF[order(DF$ID),]
On Fri, Jun 12, 2009 at 3:54 PM, MarcioRibeiro wrote:
>
> Hi listers,
> I have a data frame with 5 variables... And I want reorder the data frame
> according a specific variable X...
> I checked the sort and order functi
Dear Terry, Eleni & Heinz,
Please forgive me for imposing on your time, but since we have had similar
discussions before on this topic, I thought that it would be nice to get
your feedback on this problem.
I have written a function to compute the cumulative incidence, for a given
covariate vect
Hello,
I recently have started to learn about R, and am interested in using
it to generate data that would then get used to produce audio.
Basically, I am "envisioning" using R to create the data, based on
probability functions (and fractal data), which then gets output as a
text data file, and t
Hi,
How do I use the string content of a string variable to reference a data frame
of the same name? I want to do the typical tasks of 1) building a name with a
string variable and using the string variable to create a data frame (or any
object) whose name is the string value of the variable an
On 12/06/2009 6:00 PM, Payam Minoofar wrote:
Hi,
How do I use the string content of a string variable to reference a data frame
of the same name? I want to do the typical tasks of 1) building a name with a
string variable and using the string variable to create a data frame (or any
object) wh
Is there a *fast* converter between JSON and R? I'm aware of the rjson
package, but it is implemented in R, and it is too slow for my purposes.
TIA!
kynn
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.et
It is not so much that rjson is implemented in R that makes it slow,
just that it does not use vectorized operations.
The package RJSONIO
http://www.omegahat.org/RJSONIO
can be used as a drop-in replacement for rjson and was written to be
faster (by using vectorized operations) and exte
With apologies if I missed the answer in the response given to my previous
question.
How do I extract the name of an object and assign it to a string variable?
For example, I have a dataframe named comnoglyc
How do I assign this name to a variable dfname such that print(dfname) returns
"comnog
Hello, I'm producing a 3D plot using the persp function. All my values for X,
Y, and Z are decimals ranging from 0 to 1. I'd like to be able format the three
axes so that the tick values are 0% 20% 40%, etc... instead of just being 0 .2
.4. Does anyone know how to do this?
Many thanks,
Steve
On 12/06/2009 7:53 PM, Payam Minoofar wrote:
With apologies if I missed the answer in the response given to my previous
question.
How do I extract the name of an object and assign it to a string variable?
For example, I have a dataframe named comnoglyc
How do I assign this name to a variable
Have you considered multiplying all values by 100?
On Jun 12, 2009, at 7:56 PM, Stephen Samaha wrote:
Hello, I'm producing a 3D plot using the persp function. All my
values for X, Y, and Z are decimals ranging from 0 to 1. I'd like to
be able format the three axes so that the tick values ar
Hi Payam,
Here's a basic example using pointless
data frames and an otherwise useless
function to illustrate the issues you
want
> ## Fresh R session with nothing yet defined
> foo <- data.frame(matrix(1:12, ncol = 3))
> bar <- data.frame(matrix(101:112, ncol = 3))
>
> objects()
[1] "bar" "foo"
Hi,
I am trying to specify a multinomial logit model using the multinom function
from the nnet package. Now I add another independent variable and it halves the
AIC as given by summary(multinom()). But when I call Anova(multinom()) from the
car package, it tells me that this added variable is
Christophe Genolini wrote:
>
>
> In order to optimize the code, I would like to write myFunc in C. Is it
> possible, in the C code, to call a function define in R (dist1 or dist2)
> that will be send to myFunc as an argument ?
>
> Christophe
>
>
You want to read section 5.11: "Evaluating
Ricardo Arias Brito wrote:
>
> Dear All,
>
> Is posible calculate Std. Error for glm as lm, using
> cov(hat beta) = phi * solve(t(X) %*% hat W %*% X)^-1
> on R? Who is hat W and phi output glm?
>
> y=rpois(20,4)
> fit.glm <- glm(y ~ x, family=poisson
> summary(fit.glm)
>
> Fitted to a model g
Hi,
i had intstalled R in my home directory
and i can run the new install R from /path_of_my_home/R/bin/R
but when i type R, it runs the system installed older R 2.4
can i just type an R command and it runs my new installed R?
Thanks!
On Tue, Jun 9, 2009 at 4:00 PM, Paul Hiemstra wrote:
> Hi,
You need to adjust your PATH environment variable so that the
/path_of_my_home/R/bin comes ahead of the system R/bin directory. (Or you can
simply remove the system R/bin and substitute your own R/bin.
W.
From: r-help-boun...@r-project.org [r-help-boun..
98 matches
Mail list logo