similar to: predicted probabilities after lmer

Displaying 20 results from an estimated 4000 matches similar to: "predicted probabilities after lmer"

2008 Nov 25
0
How to predict probabilities after using lmer
Dear R-users, I'm using lmer to fit two-level logistic models and I'm interested in predicted probabilities that I get in this way (using "fitted"): glm1 = lmer(XY$T1~X1 + X2 + X3 + (1|Cind), family=binomial) #estimation of a two-level logit model fit1=fitted(glm1) # I get the fitted linear predictor ilog = function(x) { 1/(1 + exp(-x)) } ps1=ilog(fit1) # In
2011 Jan 24
5
Train error:: subscript out of bonds
Hi, I am trying to construct a svmpoly model using the "caret" package (please see code below). Using the same data, without changing any setting, I am just changing the seed value. Sometimes it constructs the model successfully, and sometimes I get an ?Error in indexes[[j]] : subscript out of bounds?. For example when I set seed to 357 following code produced result only for 8
2009 Apr 15
2
AICs from lmer different with summary and anova
Dear R Helpers, I have noticed that when I use lmer to analyse data, the summary function gives different values for the AIC, BIC and log-likelihood compared with the anova function. Here is a sample program #make some data set.seed(1); datx=data.frame(array(runif(720),c(240,3),dimnames=list(NULL,c('x1','x2','y' )))) id=rep(1:120,2); datx=cbind(id,datx) #give x1 a
2005 Aug 03
0
Chan_bluetooth and AudioGateway phone [long]
Hello, I start trying to use a USB dongle and a Bluetooth GSM phone to make GSM call with asterisk using the BLT channel provided by the GSM phone. Unfortunately I get a "Everyone is busy/congested at this time" whenever I try to Dial("IAX2/****@****/2", "BLT/MotorolaLara/3474501***") For sure I make some mistake in the configuration. Unfortunately I don't find
2006 Oct 15
0
chan_bluetooth - one way audio
I have compiled chan_bluetooth and I have used it many times before... but now I have a problem and I can?t find a solution. I have a bluetooth dongle (MSI) connected to my asterisk and I use a V3 phone to make calls to another cell phones... the thing is that I just get one way audio.. I can hear people from my IAX softphone but they can?t hear me... I don?t know what could be.. anyone had
2011 Sep 06
1
Question about Natural Splines (ns function)
Hi - How can I 'manually' reproduce the results in 'pred1' below? My attempt is pred_manual, but is not correct. Any help is much appreciated. library(splines) set.seed(12345) y <- rgamma(1000, shape =0.5) age <- rnorm(1000, 45, 10) glm1 <- glm(y ~ ns(age, 4), family=Gamma(link=log)) dd <- data.frame(age = 16:80) mm <- model.matrix( ~ ns(dd$age, 4)) pred1 <-
2008 Nov 19
1
F-Tests in generalized linear mixed models (GLMM)
Hi! I would like to perform an F-Test over more than one variable within a generalized mixed model with Gamma-distribution and log-link function. For this purpose, I use the package mgcv. Similar tests may be done using the function "anova", as for example in the case of a normal distributed response. However, if I do so, the error message "error in eval(expr, envir, enclos) :
2009 Jul 23
1
setting up LMER for repeated measures and how do I get a p value for my fixed effect, group?
R 2.8.1 Windows XP I am trying to analyze repeated measures data (the data are listed at the end of this Email message) and I need help to make sure that I have properly specified my model, and would like to know why lmer does not return a p value for Group, my fixed effect. My subjects are divided into two groups (variable GROUP), individual subjects are indicated by the variable SS, Value is
2011 May 16
0
Problem installing Rcplex in ubuntu
Dear List, I'm trying to install Rcplex on a ubuntu 64 bit machine, and have not been successful. After installing cplex latest version from ibm's website (everything as standard, except had it installed unto ~/ (the home directory) rather than the default directory). i type (from inside the directory where Rcplex_0.3-0.tar.gz is): >CPLEX_INCLUDE_PATH=~/ILOG/CPLEX/cplex
2008 May 08
2
poisson regression with robust error variance ('eyestudy
Ted Harding said: > I can get the estimated RRs from > RRs <- exp(summary(GLM)$coef[,1]) > but do not see how to implement confidence intervals based > on "robust error variances" using the output in GLM. Thanks for the link to the data. Here's my best guess. If you use the following approach, with the HC0 type of robust standard errors in the
2012 Jun 08
2
Consulta GLM
Estimados amigos, Estoy familiarizándome con los modelos lineales generalizados en R. Estoy interesado en realizar un análisis lig linear y me gustaría saber cuáles son o como extraer los valores correspondientes al chi cuadrado en el análisis para cada grupo y para las interacciones. Desde ya muchas gracias y disculpas si la pregunta es muy básica, adjunto los comandos que estoy utilizando. Si
2012 Jun 08
2
Consulta sobre GLM-log linear
Estimados amigos, Estoy familiarizándome con los modelos lineales generalizados en R. Estoy interesado en realizar un análisis lig linear y me gustaría saber cuáles son o como extraer los valores correspondientes al chi cuadrado en el análisis para cada grupo y para las interacciones. Desde ya muchas gracias y disculpas si la pregunta es muy básica, adjunto los comandos que estoy utilizando. Si
2012 Jun 08
2
Consulta sobre GLM-log linear
Estimados amigos, Estoy familiarizándome con los modelos lineales generalizados en R. Estoy interesado en realizar un análisis lig linear y me gustaría saber cuáles son o como extraer los valores correspondientes al chi cuadrado en el análisis para cada grupo y para las interacciones. Desde ya muchas gracias y disculpas si la pregunta es muy básica, adjunto los comandos que estoy utilizando. Si
2013 Sep 06
4
About de Bruijn sequences in bitmath.h
Found this code: ftp://ftp.samba.org/pub/unpacked/ntdb/lib/ccan/ilog/ilog.c Tests show that it's faster to use the following code in FLAC__bitmath_ilog2_wide(): static const unsigned char DEBRUIJN_IDX32[32]={ 0, 1,28, 2,29,14,24, 3,30,22,20,15,25,17, 4, 8, 31,27,13,23,21,19,16, 7,26,12,18, 6,11, 5,10, 9 }; FLAC__uint32 v; int m;
2002 Jul 20
3
Vorbis 1.0 spec notes, part 1
I have undertaken a small project of writing a Vorbis decoder completely from the spec, with the goal of catching any errors, both typographically and algorithmically, in the spec. My "reference" decoder is also being written in an extremely methodical style, with practically no algorithmic optimization, such that it will be clear that every step has been copied exactly from the spec.
2008 Jul 12
1
a warning message from lmer
Hi all, I have a problem when running lmer. In my data set, Agree is a binary(0/1) response. WalkerID and ObsID is the identification number of the subjects. the description of the other variables are as follows: > levels(regdat$Display) [1] "Dynamic" "Static" > levels(regdat$Survey) [1] "HM1_A" "HM1_B" "HM1_C" "HM2_A"
2004 Aug 19
1
The 'test.terms' argument in 'regTermTest' in package 'survey'
This is a question regarding the 'regTermTest' function in the 'survey' package. Imagine Z as a three level factor variable, and code ZB and ZC as the two corresponding dummy variables. X is a continuous variable. In a 'glm' of Y on Z and X, say, how do the two test specifications test.terms = c("ZB:X","ZC:X") # and test.terms = ~ ZB:X + ZC:X in
2004 Jul 21
0
ILOG/JRULES/J2EE project opportunity
Hi Please call or email me if you would be interested in the following project Senior Rules Engine (ILOG) Consultant Location: Saint Louis, MO Duration: 6 months Skills: At least 5 years strong development experience with OO languages, specifically on complex web applications using Java J2EE 3 years of Rules Engineering experience, Rules engine : ILOG experience is required
2009 Feb 26
1
logistic regression - unequal groups in R
I am getting a repeated error when I try to run a logistic regression in R 2.8.1 >(glm(prop1~x1,data=glm1,family=binomial("logit"),weights=nt1)) Error in model.frame.default(formula = prop1 ~ x1, data = glm1, weights = nt1, : invalid type (list) for variable 'x1' x1 is multistate categorical (3 categories). 2 of the categories have 12 observation, one has 9. Is this what
2010 Aug 20
3
Deviance Residuals
Dear all, I am running a logistic regression and this is the output: glm(formula = educationUniv ~ brncntr, family = binomial) Deviance Residuals: Min 1Q Median 3Q Max # ???? ????? ?? ???????? -0.8825 -0.7684 -0.7684 1.5044 1.6516 Coefficients: Estimate Std. Error z value Pr(>|z|) (Intercept) -1.06869 0.01155 -92.487 <2e-16 *** brncntrNo