使用 plot3D 更改图形轴标题相对于轴本身的距离或旋转

Changing the distance or rotation of the axis title of a graph relative to the axis itself with plot3D

我使用 R 的 plot3D 包绘制下图。我想将 z-axis 标签 ($ f (y1, y2)) 稍微移离轴值或将其保留在水平的。有谁知道我该如何继续?接下来的代码:

library("plot3D")
#Function density probability
library(pbivnorm)
bsb <- function(t1,t2){
  a1 <- sqrt(phi1/2)*(sqrt(((phi1+1)*t1)/(phi1*mu1))-sqrt(((phi1*mu1)/((phi1+1)*t1))))
  a2 <- sqrt(phi2/2)*(sqrt(((phi2+1)*t2)/(phi2*mu2))-sqrt(((phi2*mu2)/((phi2+1)*t2))))
  Phi2 <- pbivnorm(a1, a2, rho, recycle = TRUE)
  b1 <- ((phi1+1)/(2*phi1*mu1))*sqrt(phi1/2)*(((phi1*mu1)/((phi1+1)*t1))^(1/2)+((phi1*mu1)/((phi1+1)*t1))^(3/2))
  b2 <- ((phi2+1)/(2*phi2*mu2))*sqrt(phi2/2)*(((phi2*mu2)/((phi2+1)*t2))^(1/2)+((phi2*mu2)/((phi2+1)*t2))^(3/2))
  fdp <- Phi2*b1*b2
  return(fdp)
}

t1 <- seq(0.001,100,length=30)
t2 <- seq(0.001,20,length=40)
#Parameters
mu1=7
phi1=2
mu2=1
phi2=9
rho=0

z<-outer(t1,t2,bsb) # calculate density values
pmat=persp3D(t1, t2, z,
        main="",xlab="$y_{1}$",ylab="$y_{2}$",zlab="$f(y_{1},y_{2})$",cex.axis=1,cex.lab=1,
        col = "gray10",border = "gray40",
        theta=50, phi=15,
        expand=0.9,
        d=2,
        shade=0.3,
        ticktype="detailed",
        nticks=5,
        facets=FALSE,contour = list(nlevels=10,col="gray35"), zlim= c(-0.1, 0.23), bty = "b2")
text(trans3d(0,7.3,0.173,pmat), "(b)",cex=1,col="black")

图片是这样的:

我想要以下图片:

问题出在输出的大小 window 上。如果您使用更大的字体,文本看起来会更好。例如,全屏 window 我从你的原始代码中得到这个:

如果您的图形设备支持,您还可以在打开 window 时指定一个较低的 dpi 值。例如,如果我使用 dev.new(dpi = 50) 我得到

我认为 persp3D 中没有旋转标签的方法,但您可以绘制没有标签的图,然后使用 text 添加标签。您还需要增加那一侧的边距大小。例如,

par(mar = c(5.1, 9.1, 4.1, 2.1))
pmat <- persp3D(t1, t2, z, main="", xlab="$y_{1}$", ylab="$y_{2}$", 
    zlab="", cex.axis=1, cex.lab=1,
    col = "gray10", border = "gray40",
    theta=50, phi=15,
    expand=0.9, d=2, shade=0.3,
    ticktype="detailed", nticks=5,
    facets=FALSE, contour = list(nlevels=10,col="gray35"), 
    zlim= c(-0.1, 0.23), bty = "b2")
text(trans3d(0,7.3,0.173,pmat), "(b)", cex=1, col="black")
text(trans3d(0,-3,0.05,pmat), label= "$f(y_{1},y_{2})$", 
     cex=1, col="black", xpd=NA, pos=2)

这给了我: