Stargazer 为 lm (和其他)对象生成非常好的乳胶表。假设我已经通过最大似然拟合了一个模型。我希望 stargazer 为我的估计生成一个类似 lm 的表格。我怎样才能做到这一点?
虽然它有点 hacky,但一种方法可能是创建一个包含我的估计的“假”lm 对象——我认为只要 summary(my.fake.lm.object) 有效,这将有效。这很容易做到吗?
一个例子:
library(stargazer)
N <- 200
df <- data.frame(x=runif(N, 0, 50))
df$y <- 10 + 2 * df$x + 4 * rt(N, 4) # True params
plot(df$x, df$y)
model1 <- lm(y ~ x, data=df)
stargazer(model1, title="A Model") # I'd like to produce a similar table for the model below
ll <- function(params) {
## Log likelihood for y ~ x + student's t errors
params <- as.list(params)
return(sum(dt((df$y - params$const - params$beta*df$x) / params$scale, df=params$degrees.freedom, log=TRUE) -
log(params$scale)))
}
model2 <- optim(par=c(const=5, beta=1, scale=3, degrees.freedom=5), lower=c(-Inf, -Inf, 0.1, 0.1),
fn=ll, method="L-BFGS-B", control=list(fnscale=-1), hessian=TRUE)
model2.coefs <- data.frame(coefficient=names(model2$par), value=as.numeric(model2$par),
se=as.numeric(sqrt(diag(solve(-model2$hessian)))))
stargazer(model2.coefs, title="Another Model", summary=FALSE) # Works, but how can I mimic what stargazer does with lm objects?
更准确地说:使用 lm 对象,stargazer 可以很好地在表格顶部打印因变量,在相应估计值下方的括号中包含 SE,并在表格底部显示 R^2 和观察次数。如上所述,是否有一种(n 简单)方法可以通过最大似然估计的“自定义”模型获得相同的行为?
这是我将优化输出打扮成 lm 对象的微弱尝试:
model2.lm <- list() # Mimic an lm object
class(model2.lm) <- c(class(model2.lm), "lm")
model2.lm$rank <- model1$rank # Problematic?
model2.lm$coefficients <- model2$par
names(model2.lm$coefficients)[1:2] <- names(model1$coefficients)
model2.lm$fitted.values <- model2$par["const"] + model2$par["beta"]*df$x
model2.lm$residuals <- df$y - model2.lm$fitted.values
model2.lm$model <- df
model2.lm$terms <- model1$terms # Problematic?
summary(model2.lm) # Not working