如何在牛皮画中将普通的ggplot与刻面的ggplot对齐?

时间:2015-08-29 16:25:04

标签: r ggplot2 cowplot

我正在尝试使用cowplot包以出版物的方式安排绘图 我只是希望面板的尺寸和尺寸相同。

可重复的示例

library(ggplot2)
library(cowplot)

gg1 <- ggplot(mtcars)+
        geom_point(aes(x=mpg,y=hp))+
        theme_bw()+
        theme(aspect.ratio=1)

gg2 <- ggplot(mtcars)+
        geom_point(aes(x=mpg,y=hp,fill=cyl))+
        facet_wrap(~cyl,ncol=2)+
        theme_bw()+
        theme(aspect.ratio=1,
              legend.position='none')

output <- plot_grid(gg1,gg2, labels = c('A','B'),label_size = 20)
print(output)

代码生成此图。 enter image description here

如您所见,水平轴既不匹配,也不匹配面板的上边缘。

来自align的参数cowplot不适用于分面图。

有什么想法吗?

5 个答案:

答案 0 :(得分:6)

由于这是关于牛皮图和复杂排列的最高投票问题之一,我想指出牛皮图现在确实具有一些用于对齐多面图的功能。 (我是包裹作者。)但是,他们不会在这种特殊情况下工作!

例如,这可行(使用axis中的plot_grid()选项):

gg1 <- ggplot(mtcars) +
  geom_point(aes(x=mpg, y=hp)) +
  theme_bw()

gg2 <- ggplot(mtcars)+
  geom_point(aes(x=mpg, y=hp, fill=cyl)) +
  facet_wrap(~cyl, ncol=2) +
  theme_bw() +
  theme(legend.position='none')

plot_grid(gg1, gg2, labels = c('A','B'), label_size = 20,
          align = 'h', axis = 'tb')

enter image description here

我们还可以执行以下操作,以获得不同类型的对齐方式(取决于您是否希望将小平面条作为绘图的一部分计算):

plot_grid(gg1, gg2, labels = c('A', 'B'), label_size = 20,
          align = 'h', axis = 'b')

enter image description here

现在为什么我说它不适合这种情况?因为,如果您查看问题中的原始代码,您会发现我删除了theme(aspect.ratio=1)设置。牛圈图可以对齐图表,只要您不强制特定的宽高比,因为它用于对齐图表的方法通常会修改各个图表的宽高比。

答案 1 :(得分:5)

在这里,直到有人提出更优雅的答案为止:您可以使用grid.arrange包中的gridExtra来更改两个图的相对大小,以便轴排成一行。下面代码中的w参数通过给左侧绘图提供更多的水平宽度来控制它,从而使其与右侧绘图相比更大。

library(gridExtra)

w = 0.512

grid.arrange(gg1, gg2, widths=c(w,1-w), ncol=2)

您还可以使用arrangeGrobtextGrob添加&#34; A&#34;和&#34; B&#34;每个情节的标题。

w = 0.512

grid.arrange(arrangeGrob(textGrob("A", x=0.13, gp=gpar(fontface="bold", cex=1.4)), 
                         gg1, heights=c(0.03,0.97)), 
             arrangeGrob(textGrob("B", x=0.13, gp=gpar(fontface="bold", cex=1.4)), 
                         gg2, heights=c(0.03,0.97)),  
             widths=c(w,1-w), ncol=2)

在任何一种情况下,您都需要手动调整w以使图表排成一行(这就是使这种方法成为次优的原因)。 w的适当值将根据绘图的物理大小而变化。当我将下面的地图保存为1000 x 500像素的w=0.512时,png似乎运行良好。

enter image description here

更好的答案可能会涉及与this SO answer类似的内容,但适用于排列多面和非刻面图(或者更一般地说,不是一对一的对应图他们的成分之间。)

答案 2 :(得分:4)

更新:egg包现在在CRAN上 https://cran.r-project.org/web/packages/egg/index.html

我只想补充一点,@ baptiste创建了一个很棒的实验包egg,它完成了他在his answer中所写的内容:

从github(https://github.com/baptiste/egg

安装它
library("devtools")
install_github("baptiste/egg")

然后只需做

library("egg")
ggarrange(gg1, gg2, ncol=2)

您可以手动添加标签:

ap <- ggarrange(gg1,gg2, ncol=2)
ggdraw(ap) + draw_plot_label(label=c("a","b"), x=c(0,0.5), y=c(1,1))

(当我尝试首先将标签添加到各个图中时,图表没有正确排列。)

答案 3 :(得分:3)

这是基于this idea

的解决方案
library(ggplot2)
library(grid)
library(gridExtra)
library(gtable)

gtable_frame <- function(g, width=unit(1,"null"), height=unit(1,"null")){
  panels <- g[["layout"]][grepl("panel", g[["layout"]][["name"]]), ]
  ll <- unique(panels$l)
  tt <- unique(panels$t)

  fixed_ar <- g$respect
  if(fixed_ar) { # there lies madness, want to align despite aspect ratio constraints
    ar <- as.numeric(g$heights[tt[1]]) / as.numeric(g$widths[ll[1]])
    height <- width * ar
    g$respect <- FALSE
  }

  core <- g[seq(min(tt), max(tt)), seq(min(ll), max(ll))]
  top <- g[seq(1, min(tt)-1), ]
  bottom <- g[seq(max(tt)+1, nrow(g)), ]
  left <- g[, seq(1, min(ll)-1)]
  right <- g[, seq(max(ll)+1, ncol(g))]

  fg <- nullGrob()
  lg <-  if(length(left))  g[seq(min(tt), max(tt)), seq(1, min(ll)-1)] else fg
  rg <- if(length(right)) g[seq(min(tt), max(tt)), seq(max(ll)+1,ncol(g))] else fg
  grobs = list(fg, g[seq(1, min(tt)-1), seq(min(ll), max(ll))], fg, 
               lg, g[seq(min(tt), max(tt)), seq(min(ll), max(ll))], rg, 
               fg, g[seq(max(tt)+1, nrow(g)), seq(min(ll), max(ll))], fg)
  widths <- unit.c(sum(left$widths), width, sum(right$widths))
  heights <- unit.c(sum(top$heights), height, sum(bottom$heights))
  all <- gtable_matrix("all", grobs = matrix(grobs, ncol=3, nrow=3, byrow = TRUE), 
                       widths = widths, heights = heights)
  all[["layout"]][5,"name"] <- "panel" # make sure knows where the panel is for nested calls
  if(fixed_ar)  all$respect <- TRUE
  all
}


p1 <- ggplot(mtcars)+
  geom_point(aes(x=mpg,y=hp))+
  theme_bw()+
  theme(aspect.ratio=1)

p2 <- ggplot(mtcars)+
  geom_point(aes(x=mpg,y=hp,fill=cyl))+
  facet_wrap(~cyl,ncol=2)+
  theme_bw()+
  theme(aspect.ratio=1,
        legend.position='none')

g1 <- ggplotGrob(p1)
g2 <- ggplotGrob(p2)
fg1 <- gtable_frame(g1)
fg2 <- gtable_frame(g2)
grid.newpage()
grid.draw(cbind(fg1, fg2))

enter image description here

请注意,gtable_frame函数根据其面板包装图,但不包括设计的面板条(我发现它更令人愉快)。

答案 4 :(得分:0)

我有一个更简单的解决方案,坚持使用plot_grid和原始示例。但是,有些人可能会觉得这有点作弊。 通过添加嵌套的NULL图并调整其高度/宽度比,可以使用cowplot:plot_grid微调对齐的图。这在下面应用:

gg3<-plot_grid(NULL,gg2, NULL, align = 'h', nrow = 3, rel_heights = c(0.06,1,0.06))
plot_grid(gg1,gg3, labels = c('A','B'),label_size = 20)

enter image description here