1

我有两个方面包裹的情节,p1p2

p1

在此处输入图像描述

p2

在此处输入图像描述

如您所见,两个图的 x 轴值对齐,但是 y 轴值差异很大。我想将 p2 覆盖到 p1 上,将 p1 y 轴保持在左侧,并在右侧创建另一个 p2 y 轴。

这就是我现在所拥有的,但我不确定如何正确组合 p1 和 p2 的 grobs。

library(ggplot2)
library(gtable)
library(grid)

themer <- theme(panel.grid.major = element_blank(), 
                panel.grid.minor = element_blank(), 
                panel.background = element_blank(),
                panel.margin = unit(0, "lines"),
                strip.background = element_rect(fill="#F8F8F8"))

p2 <- ggplot(normaldens, aes(y=density,x=predicted)) + 
        geom_line(color="red") + 
        facet_wrap(~ motif) + 
        labs(title=paste("Methylation Score:",motif_f[j]),x="Methylation Score",y="Density") +
        themer
p1 <- ggplot(dat, aes(x=score)) +
        geom_histogram( binwidth = bin_width,col="red",fill="blue",alpha=0.2) +  
        facet_wrap(~ motif) + 
        labs(title=paste("Methylation Score:",motif_f[j]),x="Methylation Score",y="Counts") +
        themer

###### COMBINE GROBS #######
g1 <- ggplot_gtable(ggplot_build(p1))
g2 <- ggplot_gtable(ggplot_build(p2))

combo_grob <- g2
pos <- length(combo_grob) - 1
combo_grob$grobs[[pos]] <- cbind(g1$grobs[[pos]],
                                 g2$grobs[[pos]], size = 'first')
panel_num <- length(unique(df1$z))
for (i in seq(panel_num))
{
  # grid.ls(g1$grobs[[i + 1]])
  panel_grob <- getGrob(g1$grobs[[i + 1]], 'geom_point.points',
                        grep = TRUE, global = TRUE)
  combo_grob$grobs[[i + 1]] <- addGrob(combo_grob$grobs[[i + 1]], 
                                       panel_grob)
}       


pos_a <- grep('axis_l', names(g1$grobs))
axis <- g1$grobs[pos_a]
for (i in seq(along = axis))
{
  if (i %in% c(2, 4))
  {
    pp <- c(subset(g1$layout, name == paste0('panel-', i), se = t:r))

    ax <- axis[[1]]$children[[2]]
    ax$widths <- rev(ax$widths)
    ax$grobs <- rev(ax$grobs)
    ax$grobs[[1]]$x <- ax$grobs[[1]]$x - unit(1, "npc") + unit(0.5, "cm")
    ax$grobs[[2]]$x <- ax$grobs[[2]]$x - unit(1, "npc") + unit(0.8, "cm")
    combo_grob <- gtable_add_cols(combo_grob, g2$widths[g2$layout[pos_a[i],]$l], length(combo_grob$widths) - 1)
    combo_grob <- gtable_add_grob(combo_grob, ax,  pp$t, length(combo_grob$widths) - 1, pp$b)
  }
}

pp <- c(subset(g1$layout, name == 'ylab', se = t:r))

ia <- which(g1$layout$name == "ylab")
ga <- g1$grobs[[ia]]
ga$rot <- 270
ga$x <- ga$x - unit(1, "npc") + unit(1.5, "cm")

combo_grob <- gtable_add_cols(combo_grob, g2$widths[g2$layout[ia,]$l], length(combo_grob$widths) - 1)
combo_grob <- gtable_add_grob(combo_grob, ga, pp$t, length(combo_grob$widths) - 1, pp$b)
combo_grob$layout$clip <- "off"

grid.draw(combo_grob)

我得到了这个错误,我知道这与我组合两个 gtable 的方式有关。

gList(list(x = 0.5, y = 0.5, width = 1, height = 1, just = "centre", : "gList" 中只允许 'grobs') 中的错误

4

1 回答 1

2

我不认为你可以在 内做第二个 y 轴ggplot2,但是如何在一个图中同时绘制密度和直方图并使用条形标签来标记计数(而不是尝试破解第二个 y 轴)。这是一个示例(使用内置iris数据集):

首先,我们将计算密度和计数的最大值,并使用它们来创建比例因子,我们将使用这些比例因子以编程方式确保直方图和密度图具有大致相同的垂直比例。

library(dplyr) 

# Find maximum value of density
densMax = iris %>% group_by(Species) %>%
  summarise(dens = max(density(Sepal.Length)[["y"]])) %>%
  filter(dens == max(dens))

# Find maximum value of bin count
countMax = iris %>% 
  group_by(Species, 
           bins=cut(Sepal.Length, seq(floor(min(Sepal.Length)),
                                      ceiling(max(Sepal.Length)), 
                                      0.25), right=FALSE)) %>%
  summarise(count=n()) %>% 
  ungroup() %>% filter(count==max(count))

现在我们将直方图条缩放到密度图的大小。sf是比例因子:

ggplot(iris, aes(x=Sepal.Length, sf = countMax$count/densMax$dens)) + 
  geom_histogram(fill=hcl(195,100,65), colour="grey50", binwidth=0.25) +
  geom_density(colour="red", aes(y=..density.. * sf)) +
  facet_wrap(~ Species) + 
  themer

在此处输入图像描述

或者,您可以朝另一个方向前进,并将密度图缩放到直方图:

# Scale histogram bars to size of density plot
ggplot(iris, aes(x=Sepal.Length, sf = densMax$dens/countMax$count)) + 
  geom_histogram(aes(y=..count..*sf), 
                 fill=hcl(195,100,65), colour="grey50", binwidth=0.25) +
  stat_bin(aes(label=..count.., y=..count..*0.5*sf), 
           geom="text", size=4, color="white", binwidth=0.25) +
  geom_density(colour="red") +
  facet_wrap(~ Species) + 
  themer +
  labs(y="Density")

在此处输入图像描述

于 2015-08-12T02:05:40.857 回答