Displaying 3 results from an estimated 3 matches for "yi1".
Did you mean:
i1
2007 Nov 01
1
Zelig and the "blogit" model
...PDF file blogit.pdf in the Zelig
documentation:
"Use the bivariate logistic regression model ["blogit"]
if you have two binary dependent variables (Y1,Y2), and
and wish to model them jointly as a function of some
explanatory variables. Each pair of dependent variables
(Yi1,Yi2) has four potential outcomes, (Yi1=1,Yi2=1),
(Yi1=1,Yi2=0), (Yi1=0,Yi2=1), and (Yi1=0,Yi2=0). The
joint probability for each of these four outcomes is
modeled with three systematic components: the marginal
Pr(Yi1=1) and Pr(Yi2=1), and the odds ratio psi, which
describes the depen...
2010 Apr 11
1
Matrix is not symmetric under lme4
...-c(center,i)
lam<-exp(beta0+beta1+s[i])
obs<-rpois(1,lam)
y<-c(y,obs)
}
}
df<-data.frame(y,u,center)
##method1##############
#dan<-glmm(y~u,family=poisson,nest=center,points=3,data=df,print.level=2)
#names(dan)
#b0<-dan$coef[1]
#b1<-dan$coef[2]
#sigma2<-dan$coef[3]
yi1<-NULL
yi2<-NULL
for (i2 in 1:I){
yi1<-c(yi1,sum(y[u==0 & center==i2]))
yi2<-c(yi2,sum(y[u==1 & center==i2]))
}
##method2##############
fit2 <- glmer(y ~ u + (1|center), family=poisson, data=df,nAGQ=3,verbose =
TRUE, REML = FALSE )
#fit2 <- glmer(y ~ u + (1|center), famil...
2000 Feb 02
0
Deleting a component with a known probability
Here I'm again!
Imagine you have a bivariate normal sample (n=500) , with mean
vector=(0,0)T and Covariance matrix (1,.9,.9,1). How could I construct an
incomplete sample by deleting the second component Yi1 with probability:
Pi= (e**2Yi1)/(1+e**2Yi1) ?
best regards,
Adriane
-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-
r-help mailing list -- Read http://www.ci.tuwien.ac.at/~hornik/R/R-FAQ.html
Send "info", "help", or "[un]subscribe"
(...