# NOT RUN {
library("cobalt")
data("lalonde", package = "cobalt")
ps.fit <- glm(treat ~ age + educ + race + married +
nodegree + re74 + re75, data = lalonde,
family = binomial)
ps <- ps.fit$fitted.values
w1 <- get_w_from_ps(ps, treat = lalonde$treat,
estimand = "ATT")
treatAB <- factor(ifelse(lalonde$treat == 1, "A", "B"))
w2 <- get_w_from_ps(ps, treat = treatAB,
estimand = "ATT", focal = "A")
all.equal(w1, w2)
w3 <- get_w_from_ps(ps, treat = treatAB,
estimand = "ATT", treated = "A")
all.equal(w1, w3)
#A multinomial example using GBM predicted probabilities
library(gbm)
T3 <- factor(sample(c("A", "B", "C"), nrow(lalonde), replace = TRUE))
gbm.fit <- gbm(T3 ~ age + educ + race + married +
nodegree + re74 + re75, data = lalonde,
distribution = "multinomial", n.trees = 200,
interaction.depth = 3)
ps.multi <- drop(predict(gbm.fit, type = "response",
n.trees = 200))
w <- get_w_from_ps(ps.multi, T3, estimand = "ATE")
# }
Run the code above in your browser using DataLab