Displaying 20 results from an estimated 5000 matches similar to: "mixed model"
2005 Jun 26
4
Mixed model
Hi All,
I am currently conducting a mixed model. I have 7 repeated measures on a
simulated clinical trial. If I understand the model correctly, the
outcome is the measure (as a factor) the predictors are clinical group
and trial (1-7). The fixed factors are the measure and group. The random
factors are the intercept and id and group.
I tried using 2 functions to calculate mixed effects.
2005 Jun 01
2
mplot :how to deal with missing data
Hello all,
I have data:
Genes time rep vart dye y trt
130911 sa1-d07 030min 1 col g 9.636244 o
145771 sa1-d07 030min 1 col r 8.107577 c
93335 sa1-d07 030min 1 ler g 7.409566 o
94821 sa1-d07 030min 1 ler r 5.107160 c
10119101 sa1-d07 030min 2 col g 8.336862 o
11605101 sa1-d07 030min 2 col r 7.824530 c
725313 sa1-d07
2005 Jul 30
1
partial SS for anova
Hello,
I use lme4 package.
library(lme4)
fit=lmer(y ~ time+dye+trt+trt:time + (1|rep), data=dataset, na.action='na.omit')
anova(fit)
The anova gives sequential F-tests and sequential SS.
My question is: how I can get partial F-tests and partial SS?
For lm (not lmer)
anova(lm(y~x+z))
we can use
anova(fit, ssType=3)
but it is not work for lmer.
Natalia.
2009 Feb 16
2
Using eval in multinom argument
Hi,
I am having difficulty entering a 'programmable' argument into the multinom function from the nnet package. Interactively, I can get the function to work fine by calling it this way:
z1=multinom(formula = class.ind(grp[-outgroup])~ (PC1 + PC2 + PC3), data=data.frame(scores))
However I need to be able to change the number of variables I am looking for in 'scores' and so am
2010 Mar 04
4
Analogue to SPSS regression commands ENTER and REMOVE in R?
I am not sure if this question has been asked before - but is there a
procedure in R (in lm or glm?) that is equivalent to ENTER and REMOVE
regression commands in SPSS?
Thanks a lot!
--
Dimitri Liakhovitski
Ninah.com
Dimitri.Liakhovitski at ninah.com
2006 Jul 08
2
String mathematical function to R-function
hello
I make a subroutine that give-me a (mathematical)
function in string format.
I would like transform this string into function ( R
function ).
thanks for any tips.
cleber
#e.g.
fun_String = "-100*x1 + 0*x2 + 100*x3"
fun <- function(x1,x2,x3){
return(
############
evaluation( fun_String )
############
)
True String mathematical function :-( :-(
> nomes
[1]
2003 Apr 04
3
trellis.graphic in for-loop
Hi list,
I am unsuccessfully trying to produce a serious of trellis barcharts from
within a for-loop. The barcharts work outside the loop. What am I missing?
Example attached.
Thanks Herry
#XXXXXXXXXXXXXXXXXXXXXX
trellis.device(bg="white")
trellis.par.get("fontsize")->fontsize
fontsize$default<-16
trellis.par.set("fontsize",fontsize)
2020 Jun 10
2
kinit with SPN fail
Hello again, after obtaining the keytab file I tried to use kinit
keytab.file followed by the spn
$ samba-tool spn list z1
z1
User CN=z1,CN=Users,DC=home,DC=lan has the following servicePrincipalName:
zookeeper/ap42.home.lan
$ samba-tool domain exportkeytab z1.ktab --principal=z1
$ samba-tool domain exportkeytab z1.ktab
--principal=zookeeper/ap42.home.lan
$ kinit -V -k -t z1.ktab
2012 Sep 23
2
If Command in Plot
Hi Team,
I am trying to very simple plot with command plot.
Question : I am trying to plot (x,y) based on the value of Column e.
If column e value is greater than 0 then plot(x,y) otherwise do not plot it.
Data :
structure(list(x = c(1, 1, 1, 2, 2, 2, 3, 3, 3), y = c(1, 2,
3, 1, 2, 3, 1, 2, 3), e = c(0, -1, -2, 1, 0, -1, 2, 1, 0)), row.names = c(NA,
-9L), .Names = c("x",
2009 Nov 09
3
How to transform the Matrix into the way I want it ???
Hi, R users,
I'm trying to transform a matrix A into B (see below). Anyone knows how to
do it in R? Thanks.
Matrix A (zone to zone travel time)
zone z1 z2 z3 z1 0 2.9 4.3 z2 2.9 0 2.5 z3 4.3 2.5 0
B:
from to time z1 z1 0 z1 z2 2.9 z1 z3 4.3 z2 z1 2.9 z2 z2 0 z2 z3 2.5 z3 z1
4.3 z3 z2 2.5 z3 z3 0
The real matrix I have is much larger, with more than 2000 zones. But I
think it should
2009 Feb 12
2
repost: problems with lm for nested fixed-factor Anova (ANOVA I)
Dear R users,
I have posted this question several days ago and received not a single
suggestion. I believe I have provided sufficient information for at
least some help. Here I repost the question with several modifications.
I want to run nested fixed-factor Anova in R on different experiments.
I have 48 levels of the main factor x1 and 242 levels of the nested
factor z1, and continuous response
2012 Aug 08
3
help, please! matrix operations inside 3 nested loops
hello, this is my script:
#1) read in data:
daten<-read.table('K:/Analysen/STRUCTURE/input_STRUCTURE_tab_excl_5_282_559.txt',
header=TRUE, sep="\t")
daten<-as.matrix(daten)
#2) create empty matrix:
indxind<-matrix(nrow=617, ncol=617)
indxind[1:20,1:19]
#3) compare cells to each other, score:
for (s in 3:34) { #walks though the matrix colum by colum, starting at
2009 Nov 24
1
Titles in plots overlap
Hi,
I use fCopulae package to draw different graphs of univariate and bivariate skew t. But the plots titles overlap. I tried using cex.main, font.main to adjust the size but they still overlaps. Here is my code:
par(mfrow = c(3, 1))
mu = 0
Omega = 1
alpha1 = 0
alpha2 = 1.5
alpha3 = 2
alpha4 = 0.5
Z1 = matrix(dmvst(x, 1, mu, Omega, alpha1, df = Inf), length(x))
Z2 = matrix(dmvst(x, 1, mu,
2002 Mar 27
2
Error with nls
Dear R-group members,
I use:
platform i386-pc-mingw32
arch x86
os Win32
system x86, Win32
status
major 1
minor 4.1
year 2002
month 01
day 30
language R
I try to fit a 2 compartment model. The compartments are open, connected
to each other and
2006 Jun 15
3
matrix selection return types
Dear Rusers,
I would like some comments about the following results
(under R-2.2.0)
> m = matrix(1:6 , 2 , 3)
> m
[,1] [,2] [,3]
[1,] 1 3 5
[2,] 2 4 6
> z1 = m[(m[,1]==2),]
> z1
[1] 2 4 6
> is.matrix(z1)
[1] FALSE
> z2 = m[(m[,1]==0),]
> z2
[,1] [,2] [,3]
> is.matrix(z2)
[1] TRUE
Considered together, I'm a bit surprised about
2010 Feb 09
1
how to adjust the output
Hi R-users,
I have this code below and I understand the error message but do not know how to correct it. My question is how do I get rid of “with absolute error < 7.5e-06” attach to value of cdf so that I can carry out the calculation.
integrand <- function(z)
{ alp <- 2.0165
rho <- 0.868
# simplified expressions
a <- alp-0.5
c1 <-
2012 Mar 16
1
multivariate regression and lm()
Hello,
I would like to perform a multivariate regression analysis to model the
relationship between m responses Y1, ... Ym and a single set of predictor
variables X1, ..., Xr. Each response is assumed to follow its own
regression model, and the error terms in each model can be correlated.
Based on my readings of the R help archives and R documentation, the
function lm() should be able to
2008 Jul 11
1
Comparing complex numbers
Is there an easy way to compare complex numbers?
Here is a small example:
> (z1=polyroot(c(1,-.4,-.45)))
[1] 1.111111-0i -2.000000+0i
> (z2=polyroot(c(1,1,.25)))
[1] -2+0i -2+0i
> x=0
> if(any(identical(z1,z2))) x=99
> x
[1] 0
# real and imaginary parts:
> Re(z1); Im(z1)
[1] 1.111111 -2.000000
[1] -8.4968e-21 8.4968e-21
> Re(z2); Im(z2)
[1] -2
2006 Aug 30
4
Barplot
Dear all,
I have a dataset. I want to make barplot from this data.
Zero1 <- "
V1 V2 V3 V4 V5 V6 V7 V8 V9
1 1 0 0 0 1 0 0 0 Positive
2 0 0 1 0 1 0 1 1 Negative
3 0 0 1 0 0 0 1 1 Positive
4 0 1 0 1 1 1 0 1 Negative
5 0 0 1 0 1 1 0 0 Positive
6 0 1 0 0 1 1 1 1 Negative
7 1 0 1 1 1 1 1 1 Negative
8 0 0 0 0 1 0 0 1
2009 Mar 19
1
two plots side-by-side with persp3d(rgl)
Dear R-users,
I would like to place two 3D plots side-by-side in a rgl-setting. It would nice to have something like "par(mfrow=c(1,2))" for basic plots, or an array framework for wireframe(lattice) (see example below). I only managed to overlap two persp3d plots.
My final idea would be to animate both surfaces using play3d(rgl).
Thanks in advance for any help.
Best,
Carlo Giovanni