在R中绘制3个向量的最佳方法是什么?

时间:2018-05-30 17:15:52

标签: r plot

对于每个变量x和z,我有一个长度为10k的向量。对于10k中的每一个,我还使用logit和其他方法估计了倾向得分。所以我有另一个包含预测倾向得分的向量。

我想将预测的倾向矢量绘制为三维图形的高度,并将其作为x和z矢量的函数(我希望像表面一样)。这样做的最佳方法是什么?我尝试使用plot3d库中的scatter3d,看起来很糟糕。

Sampl数据:https://www.dropbox.com/s/1lf36dpxvebd7kw/mydata2.csv?dl=0

1 个答案:

答案 0 :(得分:0)

更新了答案

使用您提供的数据,我们可以对数据进行分级,通过bin获得平均倾向得分并使用geom_tile进行绘图。我在下面提供了代码。更好的选择是使用xz向量(以及您预测的二元处理变量)拟合倾向得分模型。然后,在pz_px值的完整网格上创建预测z值的新数据框并绘制该数据框。我没有适合模型的二进制处理变量,所以我没有制作实际的情节,但代码看起来像这样:

# Propensity score model
m1 = glm(treat ~ x + z, data=dat, family=binomial)

# Get propensity scores on full grid of x and z values
n = 100 # Number of grid points. Adjust as needed.
pred.dat = expand.grid(x=seq(min(dat$x),max(dat$x),length=n,
                       z=seq(min(dat$z),max(dat$z),length=n)
pred.dat$pz_p = predict(m1, newdata=pred.dat, type="response")

ggplot(pred.dat. aes(x, z, fill=pz_p)) +
  geom_tile() +
  scale_fill_gradient2(low="red", mid="white", high="blue", midpoint=0.5, limits=c(0,1))

带有分档数据的拼贴图代码:

library(tidyverse)
theme_set(theme_classic())

dat = read_csv("mydata2.csv")

# Bin by x and z
dat = dat %>% 
  mutate(xbin = cut(x,breaks=seq(round(min(x),1)-0.05,round(max(x),1)+0.05,0.1),
                    labels=seq(round(min(x),1), round(max(x),1),0.1)),
         xbin=as.numeric(as.character(xbin)),
         zbin = cut(z,breaks=seq(round(min(z),1)-0.1,round(max(z),1)+0.1,0.2),
                    labels=seq(round(min(z),1), round(max(z),1),0.2)),
         zbin=as.numeric(as.character(zbin)))

# Calculate average pz_p by bin and then plot
ggplot(dat %>% group_by(xbin, zbin) %>% 
         summarise(pz_p=mean(pz_p)), 
       aes(xbin, zbin, fill=pz_p)) +
  geom_tile() +
  scale_fill_gradient2(low="red", mid="white", high="blue", midpoint=0.5, limits=c(0,1))

enter image description here

原始答案

热图可能在这里运作良好。例如:

library(ggplot2)

# Fake data
set.seed(2)
dat = expand.grid(x=seq(0,10,length=100),
                  z=seq(0,10,length=100))  
dat$ps = 1/(1 + exp(0.3 + 0.2*dat$x - 0.5*dat$z))

ggplot(dat, aes(x, z, fill=ps)) +
  geom_tile() +
  scale_fill_gradient2(low="red", mid="white", high="blue", midpoint=0.5, limits=c(0,1)) +
  coord_equal()

enter image description here

或使用rgl::persp3d进行3D处理:

library(rgl)
library(tidyverse)

x=unique(sort(dat$x))
z=unique(sort(dat$z))
ps=dat %>% spread(z, ps) %>% select(-1) %>% as.matrix

persp3d(x, z, ps, col="lightblue")

enter image description here