Displaying 20 results from an estimated 25 matches for "memss".
Did you mean:
memsz
2009 Oct 30
1
How to properly shade the background panels of an xyplot?
Dear R users,
this is a follow up of this message
http://tolstoy.newcastle.edu.au/R/e6/help/09/05/13897.html
I'm reproducing the core of it for convenience.
> //
> / data(Oats, package = "MEMSS") /
> / tp1.oats <- xyplot(yield ~ nitro | Variety + Block, /
> / data = Oats, /
> / panel = function(x, y, subscripts, ...) { /
> / # How to normalize my heatmap metric
> with /
> /...
2009 Oct 12
3
xyplot does not find variable in data
...he "data"
for variables?
In the examples below, the "subset" argument understands that
"Variety" is a variable in the data.
But the "scales" argument does not understand that "nitro" is a
variable in the data.
What principle is at work?
library(MEMSS)
# The following works fine:
xyplot(
yield ~ nitro
, data=Oats
, scales=list(
x=list(
at=unique(Oats$nitro)
)
)
, subset=Variety=="Victory"
)
# But the following returns an error:
xyplot(
yield ~ nitro
, data=Oats
, scales=list(
x=list(
at=unique(nitro)
)
)...
2004 Apr 29
1
Plot.lme error
Dear All;
Attempting to reproduce Figure 4.15 of MEMSS (p. 171) in R using
plot(Wafer, outer = ~ Wafer)
yields an error:
> plot(Wafer, outer = ~ Wafer)
Error in order(na.last, decreasing, ...) :
Argument lengths differ
The plot() produces the figure without problems for all versions of
Splus (4.5 to 6.2) on Windows. Notici...
2012 Aug 08
3
Can not find lme
...nt type 'application/x-gzip' length 1453067 bytes (1.4 Mb)opened URL==================================================downloaded 1.4 Mb
The downloaded packages are in /var/folders/yx/l4kkhz8j24179y5vq0hp9md00000gp/T//Rtmpqsa0o1/downloaded_packagesalso installing the dependencies ‘mlmRev’, ‘MEMSS’, ‘sfsmisc’, ‘MatrixModels’
trying URL 'http://cran.csiro.au/bin/macosx/leopard/contrib/2.14/mlmRev_1.0-1.tgz'Content type 'application/x-gzip' length 1832388 bytes (1.7 Mb)opened URL==================================================downloaded 1.7 Mb
trying URL 'http://cran.csir...
2009 Oct 10
1
lattice auto.key drop unused levels
The following code produces a legend ("key") that mentions the unused
levels of Block.
library(MEMSS)
xyplot(yield~nitro, subset=(Block=="I" | Block=="II"), data=Oats,
group=Block, auto.key=T)
and adding "drop.unused.levels=T" does not fix it. And in fact even
the following does not solve the problem:
xyplot(yield~nitro, data=Oats[Oats$Block=="I" | Oats$B...
2004 Sep 08
1
Feil i websider (PR#7216)
Warnings about /metno/internweb/fouweb/htdocs/teknisk/verktoy/R/faq.html
BAD LINK: http://stat.ethz.ch/R/manual/
BAD LINK: http://nlme.stat.wisc.edu/MEMSS/
BAD LINK: http://stats.mth.uea.ac.uk/Rcgi/
BAD LINK: http://software.biostat.washington.edu/statsoft/ess/
------------------------------------------------------------
Warnings about /metno/internweb/fouweb/htdocs/teknisk/verktoy/R/resources.html
BAD LINK: http://fou.oslo.dnmi.no/teknisk/verkt...
2007 Oct 12
2
Basic plot question: Figure 1.1 Pinheiro & Bates
All,
Sorry for overly simplistic question, but I can't seem to remember how to
create the basic plot shown in Figure 1.1 of Pinheiro & Bates (2004; p.4).
The y-axis delineates a factor (Rail) while the x-axis displays the
distribution of a continuous variable (time) according to each level of the
factor. Didn't see it in archives but perhaps I'm not searching on correct
key words,
2010 Mar 12
1
Problem installing new packages
...sums checked
package 'locfit' successfully unpacked and MD5 sums checked
package 'logspline' successfully unpacked and MD5 sums checked
package 'mapproj' successfully unpacked and MD5 sums checked
package 'maps' successfully unpacked and MD5 sums checked
package 'MEMSS' successfully unpacked and MD5 sums checked
package 'mlmRev' successfully unpacked and MD5 sums checked
package 'RColorBrewer' successfully unpacked and MD5 sums checked
The downloaded packages are in
C:\Users\Owner\AppData\Local\Temp\RtmpvYKBW7\downloaded_packages
Tha...
2007 Apr 27
1
Example of mcmcsamp() failing with lmer() output
...t;- factor(gunload$group, labels = c('slight',
'average', 'heavy'))
gunload$team9 <- factor(rep(1:9, each = 2))
@
This is a split plot design with randomly selected teams for each
physique, which was crossed with two methods.
Following the Oats example in chap. 1 of MEMSS, and adapting to lmer:
<<2>>=
require(lme4)
gl.lmer <- lmer(rounds ~ method * physique + (1 | physique/team),
data = gunload)
mcmcsamp(gl.lmer)
@
lmer runs as expected, but mcmcsamp() gives:
Error: Leading minor of order 1 in downdated X'X is not positive
definite
Error in t...
2009 Jun 18
1
lattice logaritmic scale (basis "e" ), rewriting labels using xscale.component
...eplace
2 with "e" (using paste()), I get the error message that the location
isn't a numeric value.
Is there any way to get this working somehow or do I have to take a
different approach?
Thanks, Katharina
Here my failing approach:
require(lattice)
data(Earthquake, package = "MEMSS")
xscale.components.log <- function(lim, ...) {
ans <- xscale.components.default(lim = lim, ...)
tick.at <- logTicks(paste("e^",lim,sep=""), loc = c(1, 3))
ans$bottom$ticks$at <- log(tick.at, 2)
ans$bottom$labels$at <- log(tick.at, 2)
ans...
2010 Oct 24
1
140 packages in R Commander!!
...#39;RUnit' 'quadprog' 'iterators'
'locfit' 'maps' 'rcom' 'rscproxy' 'sp' 'VGAM' 'MCMCpack' 'sna' 'gee'
'anchors' 'survey' 'ape' 'flexmix' 'rmeta' 'mlmRev' 'MEMSS' 'coda' 'party'
'ipred' 'modeltools' 'e1071' 'AER' 'bdsmatrix' 'DAAG' 'fCalendar' 'fSeries'
'fts' 'its' 'timeDate' 'timeSeries' 'tis' 'tseries' 'xts' 'fore...
2006 Mar 17
1
nlme predict with se?
I am trying to make predictions with se's using a nlme (kew11.nlme
below). I get an error indicating levels for a factor are not allowed.
I have searched and read Rnews, MEMSS, MASS, R-Help, and other lists
in Spanish where I found questions similar to mine but not solution.
I do not really care about the method used. Any suggestions to obtain
predictions with se's from an nlme would be appreciated.
eal
R Version 2.2.1 (2005-12-20 r36812)
mac osx 10.4.5 on G...
2006 Jan 13
1
Syntax for linear mixed model
The syntax below works, and gives the expected results, in R version 2.0.0,
provided that I have loaded packages Matrix, latticeExtra and lme4.
However, I cannot get it to work in version 2.2.1. Can anyone tell me how
to fit this model in the more recent version?
Thanks in anticipation,
Nick Galwey
barleyprogeny.model1lme <- lme(yield_g_m2 ~ 1,
data =
2009 Apr 11
0
_Possible_ work-round for normalizePath error (was Re: [Rd] Package (PR#13475))
...ms checked
> Error in normalizePath(path) :
> path[1]: The system cannot find the file specified
>
> Second attempt:
>
> package 'Matrix' successfully unpacked and MD5 sums checked
> package 'mlmRev' successfully unpacked and MD5 sums checked
> package 'MEMSS' successfully unpacked and MD5 sums checked
> package 'lme4' successfully unpacked and MD5 sums checked
> Error in normalizePath(path) :
> path[1]: The system cannot find the file specified
>
>
> The irreproducibility made me wonder... so I turned off Norton's
&g...
2007 Sep 03
0
buglet?? in nlme:::corRatio documentation
...RUE,col=2,from=0)
What's odd, and makes me really nervous, is that the expression found
in the documentation is also that found in Pinheiro and Bates 2000
(Table 5.2, p. 232). It's not listed in the errata for the first printing
http://cm.bell-labs.com/cm/ms/departments/sia/project/nlme/MEMSS/Errata ;
I have the second printing.
(I haven't dug out my geostats books to check this, but found at least
one paper that cites the "correct" (1/(1+(d/r)^2) formula -- see below
cheers
Ben Bolker
@ARTICLE{Ekstrom+2005,
author = {Ekstr{\o}m, Claus T. and Bak, S{\o}ren and...
2005 Apr 16
1
help on extract variance components from the fitted model by lm
Hey, all: Do we have a convenient command(s) to extract the variance
components from a fitted model by lm (actually it's a nexted model)?
e.g.: using the following codes we could get MSA,MSB(A) and MSE. How
to get the variance component estimates by command in R rather than
calculations by hand?
A<-as.vector(rep(c(rep(1,5), rep(2,5), rep(3,5), rep(4,5), rep(5,5)),2))
2011 Nov 29
2
Help needed in reproducing a plot
Hello,
can anybody tell me how to produce a plot like the one in
http://cran.r-project.org/web/packages/lme4/vignettes/Implementation.pdf
on page 13, Figure 6?
The data is stored in:
library(nlme)
data(Oats)
Cheers
--
View this message in context: http://r.789695.n4.nabble.com/Help-needed-in-reproducing-a-plot-tp4119603p4119603.html
Sent from the R help mailing list archive at
2012 Jul 24
0
[R-sig-ME] lmer() - no applicable method for 'profile' under R version 2.15.1
Hi all,
I was working with the "MEMSS" & "mle4" library's under R version 2.15.1.
apparently some practical functions of do not work under R 2.15.1.
After searching the archives i found a mail thread on this subject,
stating that these problems were partialy solved for "R 2.12.0" but only
for "lm...
2003 May 28
1
Test for trend?
Hello R community,
I would like to test for learning effects by subjects in my experiment. Each subject participates in six consecutive auction rounds of the same treatment.
The response variable is the efficiency of an auction outcome measured by a real number. Since the efficiency increases over the six rounds, I suppose that subjects learn about the rules of the auction institution, but I
2012 May 25
2
problem with installing rms package
Hi
I am trying to install "rms" package but while installing it shows
following error
package 'survival' 2.36-2 is loaded, but >= 2.36.3 is required by 'rms'
what to do?
i am using linux OS
I have tried by updated r-base-core but it didnt work
regards
GRR
[[alternative HTML version deleted]]