ggplot2:如何在单个图中组合直方图、地毯图和逻辑回归预测

ggplot2: How to combine histogram, rug plot, and logistic regression prediction in a single graph

我正在尝试为逻辑回归绘制组合图作为函数 logi.hist.plot but I would like to do it using ggplot2(美学原因)。

问题是只有一个直方图应该有 scale_y_reverse()。

有什么方法可以在单个图中指定它(请参见下面的代码)或通过使用可以传递给上一个图的坐标来重叠两个直方图?

ggplot(dat) + 
    geom_point(aes(x=ind, y=dep)) + 
    stat_smooth(aes(x=ind, y=dep), method=glm, method.args=list(family="binomial"), se=FALSE) + 
    geom_histogram(data=dat[dat$dep==0,], aes(x=ind)) +
    geom_histogram(data=dat[dat$dep==1,], aes(x=ind)) ## + scale_y_reverse()

这个最终情节是我一直在努力实现的:

我们使用 geom_segment 为直方图创建“条形图”并创建地毯图。调整 size 参数以更改直方图中的“条形”宽度。在下面的示例中,条形高度等于给定 x 范围内值的百分比。如果要更改条形的绝对高度,只需在创建直方图计数的 h 数据框时将 n/sum(n) 乘以比例因子即可。

为了生成图表的直方图计数,我们预先汇总数据以创建直方图值。请注意 mutate 函数中的 ifelse 语句,它根据 y 是否为 0 调整 pct 的值以获得图中的向上和向下条形图或 1,分别。您可以在绘图代码本身中执行此操作,但是您需要两次单独调用 geom_segment.

library(dplyr)

# Fake data
set.seed(1926)
dat = data.frame(y = sample(0:1, 1000, replace=TRUE))
dat$x1 = rnorm(1000, 5, 2) * (dat$y+1)

# Summarise data to create histogram counts
h = dat %>% group_by(y) %>%
  mutate(breaks = cut(x1, breaks=seq(-2,20,0.5), labels=seq(-1.75,20,0.5), 
                      include.lowest=TRUE),
         breaks = as.numeric(as.character(breaks))) %>%
  group_by(y, breaks) %>% 
  summarise(n = n()) %>%
  mutate(pct = ifelse(y==0, n/sum(n), 1 - n/sum(n))) 

ggplot() +
  geom_segment(data=h, size=4, show.legend=FALSE,
               aes(x=breaks, xend=breaks, y=y, yend=pct, colour=factor(y))) +
  geom_segment(dat=dat[dat$y==0,], aes(x=x1, xend=x1, y=0, yend=-0.02), size=0.2, colour="grey30") +
  geom_segment(dat=dat[dat$y==1,], aes(x=x1, xend=x1, y=1, yend=1.02), size=0.2, colour="grey30") +
  geom_line(data=data.frame(x=seq(-2,20,0.1), 
                            y=predict(glm(y ~ x1, family="binomial", data=dat), 
                                      newdata=data.frame(x1=seq(-2,20,0.1)),
                                      type="response")), 
            aes(x,y), colour="grey50", lwd=1) +
  scale_y_continuous(limits=c(-0.02,1.02)) +
  scale_x_continuous(limits=c(-1,20)) +
  theme_bw(base_size=12)