更改 gbm 模型结果的 3D 部分图上的间距和轴标签 - visreg 包

Change spacing and axis labels on 3D partial plot of gbm model results - visreg package

我正在使用 visreg 包和 visreg2d() 函数创建一个 3D 部分依赖图,显示两个 gbm 模型变量之间的相互作用。我需要更改 x、y 和 z 轴标签以及间距,以便为期刊文章绘制漂亮的图。我尝试更改 par() 中的设置,但这只允许我更改标签大小。

我正在用以下内容生成情节:

visreg2d(final,n.trees=1000,xvar="ProbMn50ppb",yvar="DTW60Jurgens",plot.type="persp",type="conditional",
       theta=140,phi=40)

"final" 是我的模型对象。

我可以通过在 visreg2d() 命令中设置 axes=FALSE 来删除轴。所以我猜解决方案可能是创建具有自定义间距的自定义标签。我还可以使用 xlab=, ylab= zlab= 更改标签。但是,另一个问题是我不能为我需要的 z 标签使用表达式。

这是我的图目前的样子,带有标签和轴:

visreg2d(plot.type = "persp")persp()作图。如果我没记错的话,persp() 不能使用 expression() 作为标签,也没有移动标签的选项(您可以使用 \n(break) 粗略地移动它,例如 xlab="\nx-label").所以你需要使用 text() 手动完成。需要两个值,文本角度和中心坐标。以前我做了一个函数来计算这些值(我指的是R mailing help),我展示一下。

# top/bot are coordinates(x,y,z) of the axis; pmat is output of persp()
# pos means the label is c(left(-1) or right(1), down(-1) or up(1)) of the axis

persp_lab_f <- function(top, bot, pmat, space, pos = c(-1, -1))
{
  coords_3d <- list(top = top, bot = bot)
  coords_2d <- lapply(coords_3d, function(v, pmat) unlist(trans3d(v[1], v[2], v[3], pmat)), pmat = pmat)
  coords_2d$mid <- (coords_2d$top + coords_2d$bot)/2  # mid is calculated from 2d-coordinates
  # coords_2d$mid <- unlist(trans3d(((top + bot)/2)[1], ((top + bot)/2)[2], ((top + bot)/2)[3], pmat)) if use mid in 3d-coordinates
  tb_diff <- coords_2d$top - coords_2d$bot
  angle <- 180/pi * atan2(tb_diff[2], tb_diff[1])
  names(angle) <- "angle"
  center <-  coords_2d$mid + sqrt(space^2 / sum(tb_diff^2)) * rev(abs(tb_diff)) * pos
  out <- list(angle = angle, center = as.data.frame(t(center)))
  return(out)
}

你没有显示reproducible example,我做了(请下次提供)。

fit <- lm(Ozone ~ Solar.R + Wind + Temp + I(Wind^2) + I(Temp^2) +
            I(Wind*Temp)+I(Wind*Temp^2) + I(Temp*Wind^2) + I(Temp^2*Wind^2),
          data=airquality)

vis_d <- visreg2d(fit, xvar = "Wind", yvar = "Temp", plot.type="persp", type="conditional", theta = 140, phi = 40)

x <- vis_d$x
y <- vis_d$y
z <- vis_d$z

x_top <- c(max(x), max(y), min(z))
x_bot <- c(min(x), max(y), min(z))
y_top <- c(max(x), max(y), min(z))
y_bot <- c(max(x), min(y), min(z))
z_top <- c(max(x), min(y), max(z))
z_bot <- c(max(x), min(y), min(z))

pmat <- persp(x, y, z, theta = 140, phi = 40)

xlab_param <- persp_lab_f(x_top, x_bot, pmat, 0.1, pos = c(1, -1))
ylab_param <- persp_lab_f(y_top, y_bot, pmat, 0.1)
zlab_param <- persp_lab_f(z_top, z_bot, pmat, 0.1)

par(mar=c(1,1,1,1))
visreg2d(fit, xvar = "Wind", yvar = "Temp", plot.type="persp", type="conditional", theta = 140, phi = 40, 
         xlab = "", ylab = "", zlab = "")

text(xlab_param$center, srt = xlab_param$angle + 180, "xxxxxxxxxx")
text(ylab_param$center, srt = ylab_param$angle, "yyyyyyyyyy")
text(zlab_param$center, srt = zlab_param$angle + 180, labels = bquote(Sigma ~ .("zzzzzzzzzz")))