绘制贝叶斯模型中的交互作用(使用 rstanarm)
Plotting interaction effects in Bayesian models (using rstanarm)
我试图在 rstanarm() 的贝叶斯线性模型中展示一个变量的影响如何随另一个变量的值而变化。我能够拟合模型并从后验中抽取以查看每个参数的估计值,但尚不清楚如何给出一个变量在相互作用中的影响作为其他变化和相关不确定性的某种图(即边际效应图)。以下是我的尝试:
library(rstanarm)
# Set Seed
set.seed(1)
# Generate fake data
w1 <- rbeta(n = 50, shape1 = 2, shape2 = 1.5)
w2 <- rbeta(n = 50, shape1 = 3, shape2 = 2.5)
dat <- data.frame(y = log(w1 / (1-w1)),
x = log(w2 / (1-w2)),
z = seq(1:50))
# Fit linear regression without an intercept:
m1 <- rstanarm::stan_glm(y ~ 0 + x*z,
data = dat,
family = gaussian(),
algorithm = "sampling",
chains = 4,
seed = 123,
)
# Create data sets with low values and high values of one of the predictors
dat_lowx <- dat
dat_lowx$x <- 0
dat_highx <- dat
dat_highx$x <- 5
out_low <- rstanarm::posterior_predict(object = m1,
newdata = dat_lowx)
out_high <- rstanarm::posterior_predict(object = m1,
newdata = dat_highx)
# Calculate differences in posterior predictions
mfx <- out_high - out_low
# Somehow get the coefficients for the other predictor?
在此(线性、高斯、恒等 link、无截距)情况下,
mu = beta_x * x + beta_z * z + beta_xz * x * z
= (beta_x + beta_xz * z) * x
= (beta_z + beta_xz * x) * z
因此,要绘制 x
或 z
的边际效应,您只需要每个系数的适当范围和系数的后验分布,您可以通过
post <- as.data.frame(m1)
然后
dmu_dx <- post[ , 1] + post[ , 3] %*% t(sort(dat$z))
dmu_dz <- post[ , 2] + post[ , 3] %*% t(sort(dat$x))
然后您可以使用类似下面的方法来估计数据中每个观察的单一边际效应,它计算了数据中每个观察的 x
对 mu
的影响,并且z
对每次观察的 mu
的影响。
colnames(dmu_dx) <- round(sort(dat$x), digits = 1)
colnames(dmu_dz) <- dat$z
bayesplot::mcmc_intervals(dmu_dz)
bayesplot::mcmc_intervals(dmu_dx)
请注意,在这种情况下,列名只是观察结果。
您也可以使用 ggeffects-package, especially for marginal effects; or the sjPlot-package 来表示边际效应和其他绘图类型(对于边际效应,sjPlot 只是包装来自 ggeffects 的函数).
要绘制相互作用的边际效应,请使用 sjPlot::plot_model()
和 type = "int"
。使用 mdrt.values
定义为连续调节变量绘制哪些值,并使用 ppd
让预测基于线性预测变量的后验分布或从后验预测分布中得出。
library(sjPlot)
plot_model(m1, type = "int", terms = c("x", "z"), mdrt.values = "meansd")
plot_model(m1, type = "int", terms = c("x", "z"), mdrt.values = "meansd", ppd = TRUE)
或绘制其他特定值的边际效应,使用 type = "pred"
并在 terms
参数中指定值:
plot_model(m1, type = "pred", terms = c("x", "z [10, 20, 30, 40]"))
# same as:
library(ggeffects)
dat <- ggpredict(m1, terms = c("x", "z [10, 20, 30, 40]"))
plot(dat)
有更多选项,还有不同的自定义情节外观的方式。请参阅相关的帮助文件和包插图。
我试图在 rstanarm() 的贝叶斯线性模型中展示一个变量的影响如何随另一个变量的值而变化。我能够拟合模型并从后验中抽取以查看每个参数的估计值,但尚不清楚如何给出一个变量在相互作用中的影响作为其他变化和相关不确定性的某种图(即边际效应图)。以下是我的尝试:
library(rstanarm)
# Set Seed
set.seed(1)
# Generate fake data
w1 <- rbeta(n = 50, shape1 = 2, shape2 = 1.5)
w2 <- rbeta(n = 50, shape1 = 3, shape2 = 2.5)
dat <- data.frame(y = log(w1 / (1-w1)),
x = log(w2 / (1-w2)),
z = seq(1:50))
# Fit linear regression without an intercept:
m1 <- rstanarm::stan_glm(y ~ 0 + x*z,
data = dat,
family = gaussian(),
algorithm = "sampling",
chains = 4,
seed = 123,
)
# Create data sets with low values and high values of one of the predictors
dat_lowx <- dat
dat_lowx$x <- 0
dat_highx <- dat
dat_highx$x <- 5
out_low <- rstanarm::posterior_predict(object = m1,
newdata = dat_lowx)
out_high <- rstanarm::posterior_predict(object = m1,
newdata = dat_highx)
# Calculate differences in posterior predictions
mfx <- out_high - out_low
# Somehow get the coefficients for the other predictor?
在此(线性、高斯、恒等 link、无截距)情况下,
mu = beta_x * x + beta_z * z + beta_xz * x * z
= (beta_x + beta_xz * z) * x
= (beta_z + beta_xz * x) * z
因此,要绘制 x
或 z
的边际效应,您只需要每个系数的适当范围和系数的后验分布,您可以通过
post <- as.data.frame(m1)
然后
dmu_dx <- post[ , 1] + post[ , 3] %*% t(sort(dat$z))
dmu_dz <- post[ , 2] + post[ , 3] %*% t(sort(dat$x))
然后您可以使用类似下面的方法来估计数据中每个观察的单一边际效应,它计算了数据中每个观察的 x
对 mu
的影响,并且z
对每次观察的 mu
的影响。
colnames(dmu_dx) <- round(sort(dat$x), digits = 1)
colnames(dmu_dz) <- dat$z
bayesplot::mcmc_intervals(dmu_dz)
bayesplot::mcmc_intervals(dmu_dx)
请注意,在这种情况下,列名只是观察结果。
您也可以使用 ggeffects-package, especially for marginal effects; or the sjPlot-package 来表示边际效应和其他绘图类型(对于边际效应,sjPlot 只是包装来自 ggeffects 的函数).
要绘制相互作用的边际效应,请使用 sjPlot::plot_model()
和 type = "int"
。使用 mdrt.values
定义为连续调节变量绘制哪些值,并使用 ppd
让预测基于线性预测变量的后验分布或从后验预测分布中得出。
library(sjPlot)
plot_model(m1, type = "int", terms = c("x", "z"), mdrt.values = "meansd")
plot_model(m1, type = "int", terms = c("x", "z"), mdrt.values = "meansd", ppd = TRUE)
或绘制其他特定值的边际效应,使用 type = "pred"
并在 terms
参数中指定值:
plot_model(m1, type = "pred", terms = c("x", "z [10, 20, 30, 40]"))
# same as:
library(ggeffects)
dat <- ggpredict(m1, terms = c("x", "z [10, 20, 30, 40]"))
plot(dat)
有更多选项,还有不同的自定义情节外观的方式。请参阅相关的帮助文件和包插图。