Displaying 6 results from an estimated 6 matches for "re74".
Did you mean:
6e74
2011 Jun 26
2
how to extract data from a function printout - example provided
...e the function itself shouldn't be changed), so that further analysis on each data set could be carried out. Your help is deeply appreciated. Have a good day. Ana
Here is the code:
library(MatchIt)
f <- treat ~ age + I(age^2) + educ + I(educ^2) + black + hispan +
married + nodegree + re74 + I(re74^2) + re75 + I(re75^2)
d <- lalonde
m <- "nearest"
matching <- function(formula,data,method){
library(MatchIt)
m.out <- matchit(formula=f, data=d, method=m)
print(m.out)
print(summary(m.out))
}
matching(f,d,m)
[[alternative...
2010 Dec 21
0
"variable lengths differ (found for '(weights)')" error in Zelig library
...procedure as some
control units may be dropped.)"
The following code is for the "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....
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"...
2012 Jun 05
0
propensity score matching estimates?
...ackage 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, 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"...
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... 2624.3
AI SE...... 802.19
T-stat..... 3.2714
p.val...... 0.0010702
Original...
2011 Jul 06
0
matching, treatment effect-ATT and Zelig package
...de 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, data = match.data(m.out, "treat"), cond = TRUE)
s.out <- sim(z.out, x = x.out)
summary(s.out)
2. Without Zelig - only m...