2

来自Stata:

margins, at(age=40)

要了解为什么会产生所需的结果,让我们告诉您,如果您要键入 . 边距 边距将报告整体边距——没有任何常数的边距。因为我们的模型是逻辑模型,所以将报告预测概率的平均值。at() 选项将一个或多个协变量固定为指定的值,并且可以与因子变量和连续变量一起使用。因此,如果您键入

margins, at(age=40)

那么利润率将平均每个人的响应数据,设置年龄= 40。

有人可以帮我哪个包有用吗?我已经尝试找到子集数据的预测值的平均值,但它不适用于序列,例如边距,at(age=40 (1)50)。

4

1 回答 1

8

有很多方法可以在 R 中获得边际效应。

您应该了解,Statamargins, at 只是在平均值或代表点上评估的边际效应(请参阅文档和文档)。

我认为你会最喜欢这个解决方案,因为它与你习惯的最相似:

library(devtools)
install_github("leeper/margins")

来源:https ://github.com/leeper/margins

margins 是为了将 Stata 的(封闭源代码)margins 命令移植到 R 作为 S3 通用方法,用于计算模型对象中包含的协变量(如“lm”和“glm”类的协变量)的边际效应(或“部分效应”) )。新的“margins”类的绘图方法还移植了 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

二、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/

三、资料来源:R 概率回归边际效应

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")
于 2016-08-24T18:40:59.843 回答