similar to: multiple nesting levels in GEE

Displaying 20 results from an estimated 6000 matches similar to: "multiple nesting levels in GEE"

2011 Oct 17
1
Plotting GEE confidence bands using "predict"
Hello Fellow R Users,I have spent the last week trying to find a work around to this problem and I can't seem to solve it. I simply want to plot my GEE model result with 95% confidence bands. I am using the geepack package to run a basic GEE model involving nestling weights, to a Gaussian distribution, with "exchangeable" error structure. I am examining how nestling weight varies
2011 Jun 25
2
cluster() or frailty() in coxph
Dear List, Can anyone please explain the difference between cluster() and frailty() in a coxph? I am a bit puzzled about it. Would appreciate any useful reference or direction. cheers, Ehsan > marginal.model <- coxph(Surv(time, status) ~ rx + cluster(litter), rats) > frailty.model <- coxph(Surv(time, status) ~ rx + frailty(litter), rats) > marginal.model Call: coxph(formula =
2004 Aug 20
1
drop1 with contr.treatment
Dear R Core Team I've a proposal to improve drop1(). The function should change the contrast from the default ("treatment") to "sum". If you fit a model with an interaction (which ist not signifikant) and you display the main effect with drop1( , scope = .~., test = "F") If you remove the interaction, then everything's okay. There is no way to fit a
2009 Feb 09
1
gee with auto-regressive correlation structure (AR-M)
Dear all, I need to fit a gee model with an auto-regressive correlation structure and I faced some problems. I attach a simple example: ####################################################### library(gee) library(geepack) # I SIMULATE DATA FROM POISSON DISTRIBUTION, 10 OBS FOR EACH OF 50 GROUPS set.seed(1) y <- rpois(500,50) x <- rnorm(500) id <- rep(1:50,each=10) # EXAMPLES FOR
2008 Sep 07
1
an error to call 'gee' function in R
Dear List: I found an error when I called the 'gee' function. I cannot solve and explain it. There are no errors when I used the 'geeglm' function. Both functions fit the gee model. The project supervisor recommends me to use the 'gee' function. But I cannot explain to him why this error happens. Would you help me solve this problem? I appreciate your help. In
2010 Jul 29
1
How to get the standard error from GEE(Generalized Estimation Equations) output
I am having some difficulties to locate the standard error from GEE output. -----------sample output using list (geemodel)------------------------ Link: Identity Variance to Mean Relation: Gaussian Correlation Structure: Exchangeable Call: gee(formula = days.sick1 ~ bmi + age + gender + surveyround2 + surveyround3, id = childid, data = dat, family = gaussian,
2011 Aug 15
1
Get significant codes from a model output fit with GEE package
Does anyone know how could I get the significant codes from mixed model output fitted with a GEE package? The output I got is the following: GEE: GENERALIZED LINEAR MODELS FOR DEPENDENT DATA gee S-function, version 4.13 modified 98/01/27 (1998) Model: Link: Logit Variance to Mean Relation: Binomial Correlation Structure: Exchangeable Call: gee(formula = bru
2006 Apr 10
5
p values for a GEE model
Hi all, I have a dataset in which the output Y is observed on two groups of patients (treatment factor T with 2 levels). Every subject in each group is observed three times (not time points but just technical replication). I am interested in estimating the treatment effect and take into account the fact that I have repeated measurements for every subject. If I do this with repeated measures
2005 Sep 28
1
gee models summary
I'm running some GEE models but when I request the summary(pcb.gee) all I get are rows and rows of intercorelations and they fill up the screen buffer so I can not even scroll back to see what else might be in the summary. How do I get the summary function to NOT print the intercorrelations? Thanks, -- Dean Sonneborn Programmer Analyst Department of Public Health Sciences University of
2005 Apr 20
6
Anova - adjusted or sequential sums of squares?
Hi I am performing an analysis of variance with two factors, each with two levels. I have differing numbers of observations in each of the four combinations, but all four combinations *are* present (2 of the factor combinations have 3 observations, 1 has 4 and 1 has 5) I have used both anova(aov(...)) and anova(lm(...)) in R and it gave the same result - as expected. I then plugged this into
2009 Oct 13
2
gee: suppress printout
I'm using the function gee from the library(gee) gee(Y~X,id=clust.id,corstr="exchangeable",b=tmc$coef,family=binomial(link=logit),silent=T) Every time it runs, it dutifully prints out Beginning Cgee S-function, @(#) geeformula.q 4.13 98/01/27 user's initial regression estimate [,1] [1,] -4.5278335 [2,] -0.2737999 [3,] -0.9528306 [4,] 0.9393861 [5,]
2011 May 08
1
questions about the output of "gee" and its summary
Dear R-helpers, I am using the package "gee" to run a marginal model. Here is the output. In my simulated data, both x and z are time-varying, so I include their interaction terms with time indicator (i.e. tind=0, if time 1, and 1 if time 2) The data is simulated, so the true parameter of z both at time 1 and time 2 is 5, which is very close from the model output for time 1, z =
2008 Dec 01
1
gee + rcs
Hi all, I have fitted a gee model with the gee package and included restricted cubic spline functions. Here is the model: chol.g <- gee(SKIN ~ rcs(CHOLT, 3), id=ID, data=chol, family=binomial(link="logit"), corstr="exchangeable") To extract the log odds I use: predict.glm(chol.g, type = "link") Now I want to compute the logg odds for specific CHOLT values
2003 May 11
2
gee
I am trying to use gee() to calculate the robust standard errors for a logit model. My dataset (zol) has 195019 observations; winner, racebl, raceas, racehi are all binary variables. ID is saved as a vector of length 195019 with alternating 0's and 1's. I get the following error message. I also tried the same command with corstr set to "independence" and got the same
2009 Apr 22
1
Gee with nested desgin
Dear all, Is it possible to incorporate a nested design in GEE? I have measurements on trees that where measured in two years. The trees are nested in plots. Each plot contains 24 trees. The number of plots is 72. Hence we would expect 2 * 24 * 72 = 3456 data points. A few are missing, so we end up wih 3431 data points. This is what I have tried until now. #assuming independence between trees
2006 Mar 06
1
P-values from survreg (survival package) using a clusterterm
Hi all. Belove is the example from the cluster-help page wtih the output. I simply cannot figure out how to relate the estimate and robust Std. Err to the p-value. I am aware this a marginal model applying the sandwich estimator using (here I guess) an emperical (unstructered/exchangeable?) ICC. Shouldent it be, at least to some extend, comparable to the robust z-test, for rx :
2000 Mar 18
1
Corstr in the Gee (Generalized Estimation Equation) arguments?
Dear all: Y=a+bX1+cX2 In the Gee (Generalized Estimation Equation) arguments: The arument Corstr has sveral choices: "independence" "fixed" "stat_M_dep" "non_stat_M_dep" "exchangeable" "AR-M" "unstructured" What does each term mean? How do I choose among them? How do I know the correlation structure of
2008 Oct 29
2
call works with gee and yags, but not geepack
I have included data at the bottom of this email. It can be read in by highlighting the data and then using this command: dat <- read.table("clipboard", header = TRUE,sep="\t") I can obtain solutions with both of these: library(gee) fit.gee<-gee(score ~ chem + time, id=id, family=gaussian,corstr="exchangeable",data=dat) and library(yags) fit.yags <-
2005 Nov 25
1
Use of nesting in lmer- error in numerical expression
Dear R users, I am trying to fit a GLMM using lmer to a dataset where the brood identity (LNRREIR) is nested within mothers identity. The reason for this is that each mother can have several nests within each year and also between years. I am running the following script (actually I have tried all different combinations with LNRREIR and mother): mod <- lmer(sr~z.hatchday +
2002 Jul 16
2
scale parameter and parameter vac-cov matrix in GEE
Dear all, It looks like the parameters var-cov matrix returned by gee() is not adjusted for the scale parameter: > fm1 <- gee(nbtrp ~ strate * saison + offset(log(surf)), family = poisson, data = Eff2001, + id = loc, tol = 1e-10, corstr = "exchangeable") [1] "Beginning Cgee S-function, @(#) geeformula.q 4.13 98/01/27" [1] "running glm to get initial