来自Stata:
margins, at(age=40)
要理解为什么会产生预期结果,让我们告诉您,如果您要输入 。利润率 保证金将报告整体保证金 - 保持不变的保证金。因为我们的模特 在逻辑上,将报告预测概率的平均值。 at()选项修复 指定值的一个或多个协变量,可以与因子和连续一起使用 变量。因此,如果您输入
margins, at(age=40)
然后利润率将平均数据 对每个人的回答,设定年龄= 40。
有人可以帮助我哪个包有用吗?我已经尝试找到子集数据的预测值的平均值,但它不适用于序列,例如边距,(年龄= 40(1)50)。
答案 0 :(得分:6)
有许多方法可以在R中获得边际效应。
你应该明白,Stata的margins, at
只是在手段或代表点评估的边际效应(参见this和文档)。
我认为您最喜欢这种解决方案,因为它与您习惯的方式最相似:
library(devtools)
install_github("leeper/margins")
来源:https://github.com/leeper/margins
利润率是一种努力移植Stata的(闭源)边缘命令 R作为计算边际效应的S3通用方法(或 "包含在模型对象中的协变量的部分效应(#34;) 课程" lm"和" glm")。新的"边距"的绘图方法类 另外端口marginsplot命令。
library(margins)
x <- lm(mpg ~ cyl * hp + wt, data = mtcars)
(m <- margins(x))
cyl hp wt 0.03814 -0.04632 -3.11981
另请参阅此包中的prediction
命令(?prediction
)。
除此之外,我还编写了一些其他解决方案:
予。 erer
(包)
maBina() command
http://cran.r-project.org/web/packages/erer/erer.pdf
II。 mfxboot
mfxboot <- function(modform,dist,data,boot=1000,digits=3){
x <- glm(modform, family=binomial(link=dist),data)
# get marginal effects
pdf <- ifelse(dist=="probit",
mean(dnorm(predict(x, type = "link"))),
mean(dlogis(predict(x, type = "link"))))
marginal.effects <- pdf*coef(x)
# start bootstrap
bootvals <- matrix(rep(NA,boot*length(coef(x))), nrow=boot)
set.seed(1111)
for(i in 1:boot){
samp1 <- data[sample(1:dim(data)[1],replace=T,dim(data)[1]),]
x1 <- glm(modform, family=binomial(link=dist),samp1)
pdf1 <- ifelse(dist=="probit",
mean(dnorm(predict(x, type = "link"))),
mean(dlogis(predict(x, type = "link"))))
bootvals[i,] <- pdf1*coef(x1)
}
res <- cbind(marginal.effects,apply(bootvals,2,sd),marginal.effects/apply(bootvals,2,sd))
if(names(x$coefficients[1])=="(Intercept)"){
res1 <- res[2:nrow(res),]
res2 <- matrix(as.numeric(sprintf(paste("%.",paste(digits,"f",sep=""),sep=""),res1)),nrow=dim(res1)[1])
rownames(res2) <- rownames(res1)
} else {
res2 <- matrix(as.numeric(sprintf(paste("%.",paste(digits,"f",sep=""),sep="")),nrow=dim(res)[1]))
rownames(res2) <- rownames(res)
}
colnames(res2) <- c("marginal.effect","standard.error","z.ratio")
return(res2)}
来源:http://www.r-bloggers.com/probitlogit-marginal-effects-in-r/
III。资料来源:R probit regression marginal effects
x1 = rbinom(100,1,.5)
x2 = rbinom(100,1,.3)
x3 = rbinom(100,1,.9)
ystar = -.5 + x1 + x2 - x3 + rnorm(100)
y = ifelse(ystar>0,1,0)
probit = glm(y~x1 + x2 + x3, family=binomial(link='probit'))
xbar <- as.matrix(mean(cbind(1,ttt[1:3])))
现在是图形,即x1,x2和x3的边际效应
library(arm)
curve(invlogit(1.6*(probit$coef[1] + probit$coef[2]*x + probit$coef[3]*xbar[3] + probit$coef[4]*xbar[4]))) #x1
curve(invlogit(1.6*(probit$coef[1] + probit$coef[2]*xbar[2] + probit$coef[3]*x + probit$coef[4]*xbar[4]))) #x2
curve(invlogit(1.6*(probit$coef[1] + probit$coef[2]*xbar[2] + probit$coef[3]*xbar[3] + probit$coef[4]*x))) #x3
library(AER)
data(SwissLabor)
mfx1 <- mfxboot(participation ~ . + I(age^2),"probit",SwissLabor)
mfx2 <- mfxboot(participation ~ . + I(age^2),"logit",SwissLabor)
mfx3 <- mfxboot(participation ~ . + I(age^2),"probit",SwissLabor,boot=100,digits=4)
mfxdat <- data.frame(cbind(rownames(mfx1),mfx1))
mfxdat$me <- as.numeric(as.character(mfxdat$marginal.effect))
mfxdat$se <- as.numeric(as.character(mfxdat$standard.error))
# coefplot
library(ggplot2)
ggplot(mfxdat, aes(V1, marginal.effect,ymin = me - 2*se,ymax= me + 2*se)) +
scale_x_discrete('Variable') +
scale_y_continuous('Marginal Effect',limits=c(-0.5,1)) +
theme_bw() +
geom_errorbar(aes(x = V1, y = me),size=.3,width=.2) +
geom_point(aes(x = V1, y = me)) +
geom_hline(yintercept=0) +
coord_flip() +
opts(title="Marginal Effects with 95% Confidence Intervals")