similar to: matching, treatment effect-ATT and Zelig package

Displaying 20 results from an estimated 800 matches similar to: "matching, treatment effect-ATT and Zelig package"

2010 Dec 21
0
"variable lengths differ (found for '(weights)')" error in Zelig library
Dear R users, I am trying to estimate to estimate the average treatmen effect on the treated (ATT) using first the MatchIt software to weight the data set and, after this, the Zelig software as shown in Ho et al. (2007). See here for an explanation of how to apply this technique in R: http://imai.princeton.edu/research/files/matchit.pdf I encounter a slight problem when I apply the weights that
2011 Jan 25
0
Problem with matchit() and zelig()
Dear all, Does anybody know why the following code returns an error message? >library(MatchIt) >library(Zelig) >data(lalonde) > >m.out1<-matchit(treat~age+educ+black+hispan+nodegree+married +re74+re75, method="full", data=lalonde) > >z.out1<-zelig(re78~age+educ+black+hispan+nodegree+married+re74+re75, data=match.data(m.out1, "control"),
2011 Jun 26
2
how to extract data from a function printout - example provided
Hi there, Does anyone know how to extract data from a function that prints out two or more summaries? In the function below (the whole code is provided) we get 5 different tables of data. I would like to split each of these tables in a separate file (while the function itself shouldn't be changed), so that further analysis on each data set could be carried out. Your help is deeply
2012 Jun 05
0
propensity score matching estimates?
I'm using the "Match" package to do propensity score matching. Here's some example code that shows the problem that I'm having (much of this code is taken from the Match package documentation): *data(lalonde) glm1 <- glm(treat~age + I(age^2) + educ + I(educ^2) + black + hisp + married + nodegr + re74 + I(re74^2) + re75 + I(re75^2) + u74 + u75,
2012 Jul 15
1
how to extract p-value in GenMatch function
Dear R-Users, I have a problem on extracting T-Stat and P-Value. I have written R-code below library("Matching") data("lalonde") attach(lalonde) names(lalonde) Y <- lalonde$re78 Tr <- lalonde$treat glm1 <- glm(Tr~age+educ+black+hisp+married+nodegr+re74+re75,family=binomial,data=lalonde) pscore.predicted <- predict(glm1) rr1 <-
2009 Feb 19
0
Zelig method setx()
Hello, I am attempting to "automate" a Bayesian normal linear regression using Zelig. Basically, I have a list containing several zelig() objects, each having a different formula, same data set, and same model (normal.bayes). My problem lies in the setx() method, where I am setting a numeric parameter to a value other than the mean. This is straightforward if I input the parameters
2005 Dec 01
0
guidelines on "depends" versus "suggests" and R versions
On the topic of when to use "suggests" and "depends" and on R version requirements. I have cc'd this message to R-devel because I am curious about what senior developpers think about these issues. The problem arises because we are using some functions from the package "matchit" in a new version of our package "portfolio". We are listing the matchit in
2011 Dec 16
0
Error constructing probabilities in Zelig
I've run an ordered logistic regression model in R with Zelig and am looking to calculate predicted probabilities. Zelig has a series of simple one line commands to generate the information I want on first differences and so forth. Unfortunately, I keep getting an error when running the zelig function and was wondering if there was a quick alternative for generating predicted probabilities for
2005 Jan 06
0
package Zelig problem with setx
Hi! Does somebody out there has experience with the Zelig package from Harvard uni? I have a problem when trying to set the explanatory variables with setx Polytomous logistic regression: >z.out <- zelig(OPARS ~ v1+v2+v3+...+vn, model = "mlogit", data=heb) that's OK >x.out<-set(z.out) Error in seq.Date(along = object) : `from' must be specified #??? I have no date
2006 Apr 04
0
simulation with Zelig
Dear R-friends, I am trying to use the Zelig library to simulate the following model: z.out<-zelig(formula = y ~ x1*x2 + x3 + x4 + x5, model="ls", data = my.data, weights = my.weights) Since the regression is weighted before running the regression I used the procedure: zelig2ls <- function(formula, model, data, M, ...) { mf <- match.call(expand.dots = TRUE)
2005 Jan 11
0
New package: MatchIt
We would like to announce the release of our software MatchIt, now available on CRAN. MatchIt implements a variety of matching methods for causal inference. Abstract: MatchIt implements the suggestions of Ho, Imai, King, and Stuart (2004) for improving parametric statistical models by preprocessing data with nonparametric matching methods. MatchIt implements a wide range of sophisticated
2005 Jan 11
0
New package: MatchIt
We would like to announce the release of our software MatchIt, now available on CRAN. MatchIt implements a variety of matching methods for causal inference. Abstract: MatchIt implements the suggestions of Ho, Imai, King, and Stuart (2004) for improving parametric statistical models by preprocessing data with nonparametric matching methods. MatchIt implements a wide range of sophisticated
2004 Mar 23
0
New R package
Zelig: Everyone's Statistical Software Kosuke Imai, Gary King and Olivia Lau Version 1.0 (Available at http://gking.harvard.edu/zelig) A growing proportion of statisticians and methodologists from many disciplines are converging on R, a powerful statistics package and programming language. As an open source project, R is freely
2011 Dec 16
0
Incorrect Number of Dimensions in Zelig with setx()
I'm running an ordered logit in R with the Zelig package and am trying to calculate some predicted probabilities. However, I get the following error message. > x.low <- setx(mod, cars=1)Error in dta[complete.cases(mf), names(dta) %in% vars, drop = FALSE] : incorrect number of dimensions I googled this problem and couldn't find anything, minus a question by me on this same
2013 Mar 05
2
Zelig package: Coxph model problems
Hi, I'm having problems with the Zelig package - when using the below R displays the follwing message (I'm running R i386 2.15.3 for Windows and have updated all the Zelig packages): z.out<-zelig(Surv(psurv2, pcens2) ~ ren_sup3 + age, data=data_urgent, model="coxph") ** The model "coxph" is not available with the currently loaded packages, ** and is not an
2012 Oct 26
0
combined output with zelig is not working!?!
Hi everyone, I have carried out a multiple imputation in R using Amelia II and have created 5 multiply imputed datasets. The purpose of my research is to fit a Poisson Model to the data to estimate numbers of hospital admissions. Now that I have 5 completed datasets and I have to pool all the 5 datasets to get one combined output for a poisson model. I have checked previous queries about
2009 Oct 30
1
Package zelig
hello all I am using the R package Zelig for some tobit regression with robust standard errors. I have got R version 2.9.2 (2009-08-24) and Zelig Version: 3.4-5 when i do demo(robust) It ends like this way data(coalition) > # Fit the model with robust standard error > user.prompt() Press <return> to continue: > z.out3 <- zelig(Surv(duration, ciep12) ~ polar + numst2 +
2009 Dec 07
0
zelig logit survey
When I use zelig to compute parameter estimates with "model = logit.survey", I receive the following error: Nicholas Carnes. 2007. "logt.surveyWarning message: In eval(expr, envir, enclose) : non-integer #successes in a binomial glm! I believe this is because the model is not using "quasibinomial" (see R-News 2003, Analyzing Survey Data in R, by Thomas Lumley). Is there
2010 Mar 29
1
Question about 'logit' and 'mlogit' in Zelig
I'm running a multinomial logit in R using the Zelig packages. According to str(trade962a), my dependent variable is a factor with three levels. When I run the multinomial logit I get an error message. However, when I run 'model=logit' it works fine. any ideas on whats wrong? ## MULTINOMIAL LOGIT anes96two <- zelig(trade962a ~ age962 + education962 + personal962 + economy962 +
2007 Nov 01
1
Zelig and the "blogit" model
Hi Folks, According to the 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),