similar to: fixed effects following lmer and mcmcsamp - which to present?

Displaying 20 results from an estimated 1000 matches similar to: "fixed effects following lmer and mcmcsamp - which to present?"

2008 Oct 08
1
Suspicious output from lme4-mcmcsamp
Hello, R community, I have been using the lmer and mcmcsamp functions in R with some difficulty. I do not believe this is my code or data, however, because my attempts to use the sample code and 'sleepstudy' data provided with the lme4 packaged (and used on several R-Wiki pages) do not return the same results as those indicated in the help pages. For instance: > sessionInfo() R
2006 Aug 11
1
help:coerce lmer.coef to matrix
Hi, Thanks for your response, it nearly worked! But it only wrote one coloumn of data and not the three columns I need. Using fixef(m1) doesnt give the same results as coef(m1) when you are using more than one random effect. I need the coefficients for each individual so I use coef(m1) to get this which results in an object of class lmer.coef, 3 columns by 700 rows. as.data.frame() wont work on
2006 Jul 04
1
lmer print outs without T
Hi, I have been having a tedious issue with lmer models with lots of factors and lots of levels. In order to get the basic information at the beginning of the print out I also have to generate these enormous tables as well. Is there a method command to leave off all of the effects and correlations? Or, do I have to go to string commands?
2011 Feb 19
0
lmer, MCMCsamp and ranef samples?
I really hope sombody could help me with the following, I'm having problems accessing the random effect samples following the example on MCMCsamp: (fm1 <- lmer(Reaction ~ Days + (1|Subject) + (0+Days|Subject), sleepstudy)) set.seed(101); samp0 <- mcmcsamp(fm1, n = 1000, saveb=TRUE) str(samp0) Formal class 'merMCMC' [package "lme4"] with 9 slots ..@ Gp :
2006 Dec 11
2
How to write a two-way interaction as a random effect in a lmer model?
Dear All, I am working with linear mixed-effects models using the lme4 package in R. I created a model with the lmer function including some main effects, a two-way interaction and a random effect. Now I am searching how I could incorporate an interaction between the random effect and one of the fixed effects. I tried to express the interaction in:
2006 Oct 20
1
mcmcsamp - How does it work?
Hello, I am a chemical student and I make use of 'lme/lmer function' to handle experiments in split-plot structures. I know about the mcmcsamp and I think that it's very promissory. I would like knowing "the concept behind" of the mcmcsamp function. I do not want the C code of the MCMCSAMP function. I would like to get the "pseudo-algorithm" to understanding that
2009 Feb 11
2
generalized mixed model + mcmcsamp
Hi, I have fitted a generalized linear mixed effects model using lmer (library lme4), and the family = quasibinomial. I have tried to obtain a MCMC sample, but on calling mcmcsamp(model1, 1000) I get the following error which I don't understand at all: Error in .local(object, n, verbose, ...) : Update not yet written traceback() delivers: 4: .Call(mer_MCMCsamp, ans, object) 3:
2008 Jun 09
2
Crosscorr.plot
Just out of curiosity, why might this be occuring: > class(x6) [1] "mcmc" > crosscorr.plot(x6) NULL # Replicable code example(lmer) x6 <- mcmcsamp(fm1, n=1000) crosscorr.plot(x6)
2006 Feb 10
1
mcmcsamp shortening variable names; how can i turn this feature off?
I have written a function called mcsamp() that is a wrapper that runs mcmcsamp() and automatically monitors convergence and structures the inferences into vectors and arrays as appropriate. But I have run into a very little problem, which is that mcmcsamp() shortens the variable names. For example: > set.seed (1) > group <- rep (1:5,10) > a <- rnorm (5,-3,3) > y <-
2010 Jan 31
2
lmer, mcmcsamp, coda, HPDinterval
Hi, I've got a linear mixed model created using lmer: A6mlm <- lmer(Score ~ division + (1|school), data=Age6m) (To those of you to whom this model looks familiar, thanks for your patience with this & my other questions.) Anyway, I was trying this to look at the significance of my fixed effects: A6post <- mcmcsamp(A6mlm, 50000) library(coda) HPDinterval(A6post) ..but I got this
2006 Oct 18
1
lmer- why do AIC, BIC, loglik change?
Hi all, I am having issues comparing models with lmer. As an example, when I run the code below the model summaries (AIC, BIC, loglik) differ between the summary() and anova() commands. Can anyone clear up what's wrong? Thank you! Darren Ward library(lme4) data(sleepstudy) fm1<-lmer(Reaction ~ Days + (1|Subject), sleepstudy) summary(fm1) fm2<-lmer(Reaction ~ Days +
2007 Apr 27
1
Example of mcmcsamp() failing with lmer() output
Hi, I would appreciate help with the following model <<1>>= gunload <- read.table(hh('datasets/gunload.dat'), header = T) gunload$method <- factor(gunload$method, labels = c('new', 'old')) gunload$physique <- factor(gunload$group, labels = c('slight', 'average', 'heavy')) gunload$team9 <- factor(rep(1:9, each = 2)) @ This
2007 Jun 25
1
conflict between lme4 and RMySQL packages (PR#9753)
Full_Name: Dale Barr Version: 2.5.1 (patched) OS: Ubuntu linux x86_64 Submission from: (NULL) (138.23.70.108) When RMySQL is loaded in before lme4, the summary() function for lmer objects in the lme4 packages produces the following error: Error in printMer(object) : no slot of name "status" for this object of class "table" When RMySQL is loaded AFTER lme4, however, no such
2006 Aug 08
1
fixed effects constant in mcmcsamp
I'm fitting a GLMM to some questionnaire data. The structure is J individuals, nested within I areas, all of whom answer the same K (ordinal) questions. The model I'm using is based on so-called continuation ratios, so that it can be fitted using the lme4 package. The lmer function fits the model just fine, but using mcmcsamp to judge the variability of the parameter estimates produces
2008 Aug 20
3
bug in lme4?
Dear all, I found a problem with 'lme4'. Basically, once you load the package 'aod' (Analysis of Overdispersed Data), the functions 'lmer' and 'glmer' don't work anymore: library(lme4) (fm1 <- lmer(Reaction ~ Days + (Days|Subject), sleepstudy)) (gm1 <- glmer(cbind(incidence, size - incidence) ~ period + (1 | herd), family = binomial, data
2008 Sep 27
1
Using the mcmcsamp function
Hello, I'm building a couple of mixed models using the lmer function. The actual modelling is going well, but doing some reading on the use of crossed random effects and the comparison of models with and without random effects it is clear that I need to generate some Markov Chain Monte Carlo samples. However, I'm struggling because everyone time I go to generate a sample I get the
2007 Jan 03
1
mcmcsamp and variance ratios
Hi folks, I have assumed that ratios of variance components (Fst and Qst in population genetics) could be estimated using the output of mcmcsamp (the series on mcmc sample estimates of variance components). What I have started to do is to use the matrix output that included the log(variances), exponentiate, calculate the relevant ratio, and apply either quantile or or HPDinterval to get
2009 Feb 24
2
lmer, estimation of p-values and mcmcsamp
(To the list moderator: I just subscribed to the list. Apologies for not having done so longer before trying to post.) Hi all, I am currently using lmer to analyze data from an experiment with a single fixed factor (treatment, 6 levels) and a single random factor (block). I've been trying to follow the online guidance for estimating p-values for parameter estimates on these and other
2010 Dec 31
2
Class "coef.mer" into a data.frame?
Hello, Could somebody please tell me what am I doing wrong in following? I try extract coefficients (using arm-package) from the lmer frunction, but I get the following warning: a<-data.frame(coef(res)) Error in as.data.frame.default(x[[i]], optional = TRUE, stringsAsFactors = stringsAsFactors) : cannot coerce class "coef.mer" into a data.fram I think I have done it before
2007 Oct 08
2
estfun & df
Hello EVERYONE, I need an URGENT help from you please! How can I see the "estfun" (empirical estimating function) and "df" (degree of freedom) from the following mixed-model please? (fm1 <- lmer2(Reaction ~ Days + (Days|Subject), sleepstudy)) Many thanks in advance for your kind help. Sattar