Displaying 5 results from an estimated 5 matches for "re78".
Did you mean:
fe78
2011 Jul 06
0
matching, treatment effect-ATT and Zelig package
Hi there,
I'm wondering what Zelig in the following situation (code below) actually does. Is this considered as a so called regression adjustment after the propensity score matching?
library(MatchIt)
library(Zelig)
data(lalonde)
re78 represents the outcome variable
1. With Zelig
m.out <- matchit(treat ~ age + educ + black + hispan + married + nodegree + re74 + re75, data = lalonde)
z.out <- zelig(re78 ~ distance, data = match.data(m.out, "control"), model = "ls")
x.out <- setx(z.out, fn = NULL,...
2010 Dec 21
0
"variable lengths differ (found for '(weights)')" error in Zelig library
...lalonde" data set, where I get an error
message in the end:
> library(Zelig)
> library(MatchIt)
> data(lalonde)
> m.out1 = matchit(treat ~ age + educ + black + hispan + nodegree + married
+ re74 + re75, method = "subclass", subclass=6, data = lalonde)
> z.out1 = zelig(re78 ~ age + educ + black + hispan + nodegree + married +
re74 + re75, data = match.data(m.out1, "control"), model = "ls",
weights="weights")
> x.out1 = setx(z.out1, data = match.data(m.out1, "treat"), cond = TRUE)
> s.out1 = sim(z.out1, x = x.out1)
Error in...
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"), model="ls" , weights="weights" )
>
>x.out1<-setx(z.out1, data=match.data(m.out1, "treat"), cond=T )
>
>s.out1<-sim(z.out1, x=x.out1)
>
Error in model.fr...
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 <- Match(Y=Y,Tr=Tr,X=glm1$fitted,estimand="ATT", M=1,ties=TRUE,replace=TRUE)
summary(rr1)
> summary(rr1)
Estimate... 26...
2012 Jun 05
0
propensity score matching estimates?
...s
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, family=binomial, data=lalonde)
X <- glm1$fitted
Y <- lalonde$re78
Tr <- lalonde$treat
# one-to-one matching with replacement (the "M=1" option).
# Estimating the treatment effect on the treated (the "estimand" option
defaults to ATT).
rr <- Match(Y=Y, Tr=Tr, X=X, M=1);*
And here's where the 'problem' occurs:
*summary(rr)...