我花了很多时间试图将11个图形拟合到一个图中,并使用gridExtra对其进行排列,但是我不幸失败了,所以我希望您能提供帮助。

我有11种钻石分类(称为size1)和其他11种分类(size2),并且我想绘制出每增加1种size1和1种增加clarity(从1到6)的中位数价格如何随钻石的size2增加而变化,并进行绘图同一张图中的所有11个图。
我尝试按照其他帖子中的建议使用gridExtra,但图例位于右侧,并且所有图形都向左挤压,请您帮我弄清楚如何为gridExtra指定图例的“宽度”?我找不到任何好的解释。非常感谢您的帮助,我真的很感激...

我一直在尝试寻找一个很好的例子来重新创建我的数据框,但在此方面也失败了。我希望这个数据框有助于理解我的工作方式,无法使它正常工作,并且与我的相同,并且某些图没有足够的数据,但是重要的部分是使用gridExtra(但是,如果您对其他部分有其他意见,请告诉我):

library(ggplot2)
library(gridExtra)

df <- data.frame(price=matrix(sample(1:1000, 100, replace = TRUE), ncol = 1))

df$size1 = 1:nrow(df)
df$size1 = cut(df$size1, breaks=11)
df=df[sample(nrow(df)),]
df$size2 = 1:nrow(df)
df$size2 = cut(df$size2, breaks=11)
df=df[sample(nrow(df)),]
df$clarity = 1:nrow(df)
df$clarity = cut(df$clarity, breaks=6)

# Create one graph for each size1, plotting the median price vs. the size2 by clarity:
for (c in 1:length(table(df$size1))) {

  mydf = df[df$size1==names(table(df$size1))[c],]
  mydf = aggregate(mydf$price, by=list(mydf$size2, mydf$clarity),median);
  names(mydf)[1] = 'size2'
  names(mydf)[2] = 'clarity'
  names(mydf)[3] = 'median_price'

  assign(paste("p", c, sep=""), qplot(data=mydf, x=as.numeric(mydf$size2), y=mydf$median_price, group=as.factor(mydf$clarity), geom="line", colour=as.factor(mydf$clarity), xlab = "number of samples", ylab = "median price", main = paste("region number is ",c, sep=''), plot.title=element_text(size=10)) + scale_colour_discrete(name = "clarity")  + theme_bw() + theme(axis.title.x=element_text(size = rel(0.8)), axis.title.y=element_text(size = rel(0.8)) , axis.text.x=element_text(size=8),axis.text.y=element_text(size=8) ))
  }

# Couldnt get some to work, so use:
p5=p4
p6=p4
p7=p4
p8=p4
p9=p4

# Use gridExtra to arrange the 11 plots:

g_legend<-function(a.gplot){
tmp <- ggplot_gtable(ggplot_build(a.gplot))
leg <- which(sapply(tmp$grobs, function(x) x$name) == "guide-box")
legend <- tmp$grobs[[leg]]
return(legend)}

mylegend<-g_legend(p1)


grid.arrange(arrangeGrob(p1 + theme(legend.position="none"),
                     p2 + theme(legend.position="none"),
                     p3 + theme(legend.position="none"),
                     p4 + theme(legend.position="none"),
                     p5 + theme(legend.position="none"),
                     p6 + theme(legend.position="none"),
                     p7 + theme(legend.position="none"),
                     p8 + theme(legend.position="none"),
                     p9 + theme(legend.position="none"),
                     p10 + theme(legend.position="none"),
                     p11 + theme(legend.position="none"),
                     main ="Main title",
                     left = ""), mylegend,
                    widths=unit.c(unit(1, "npc") - mylegend$width, mylegend$width), nrow=1)

最佳答案

我不得不略微更改qplot循环调用(即将因素放入数据框),因为它引发了大小不匹配的错误。我不包括这一点,因为该部分显然在您的环境中有效,或者它是错误的粘贴。

尝试像这样调整widths单位:

widths=unit(c(1000,50),"pt")

而且您会得到一些与您可能期望的更接近的东西:

而且,几个月后,我现在可以粘贴代码了:-)
library(ggplot2)
library(gridExtra)

df <- data.frame(price=matrix(sample(1:1000, 100, replace = TRUE), ncol = 1))

df$size1 = 1:nrow(df)
df$size1 = cut(df$size1, breaks=11)
df=df[sample(nrow(df)),]
df$size2 = 1:nrow(df)
df$size2 = cut(df$size2, breaks=11)
df=df[sample(nrow(df)),]
df$clarity = 1:nrow(df)
df$clarity = cut(df$clarity, breaks=6)

# Create one graph for each size1, plotting the median price vs. the size2 by clarity:
for (c in 1:length(table(df$size1))) {

  mydf = df[df$size1==names(table(df$size1))[c],]
  mydf = aggregate(mydf$price, by=list(mydf$size2, mydf$clarity),median);
  names(mydf)[1] = 'size2'
  names(mydf)[2] = 'clarity'
  names(mydf)[3] = 'median_price'
  mydf$clarity <- factor(mydf$clarity)

  assign(paste("p", c, sep=""),
         qplot(data=mydf,
               x=as.numeric(size2),
               y=median_price,
               group=clarity,
               geom="line", colour=clarity,
               xlab = "number of samples",
               ylab = "median price",
               main = paste("region number is ",c, sep=''),
               plot.title=element_text(size=10)) +
           scale_colour_discrete(name = "clarity") +
           theme_bw() + theme(axis.title.x=element_text(size = rel(0.8)),
                              axis.title.y=element_text(size = rel(0.8)),
                              axis.text.x=element_text(size=8),
                              axis.text.y=element_text(size=8) ))
}

# Use gridExtra to arrange the 11 plots:

g_legend<-function(a.gplot){
  tmp <- ggplot_gtable(ggplot_build(a.gplot))
  leg <- which(sapply(tmp$grobs, function(x) x$name) == "guide-box")
  legend <- tmp$grobs[[leg]]
  return(legend)}

mylegend<-g_legend(p1)


grid.arrange(arrangeGrob(p1 + theme(legend.position="none"),
                         p2 + theme(legend.position="none"),
                         p3 + theme(legend.position="none"),
                         p4 + theme(legend.position="none"),
                         p5 + theme(legend.position="none"),
                         p6 + theme(legend.position="none"),
                         p7 + theme(legend.position="none"),
                         p8 + theme(legend.position="none"),
                         p9 + theme(legend.position="none"),
                         p10 + theme(legend.position="none"),
                         p11 + theme(legend.position="none"),
                         top ="Main title",
                         left = ""), mylegend,
             widths=unit(c(1000,50),"pt"), nrow=1)

编辑(16/07/2015):使用gridExtra> = 2.0.0时,main参数已重命名为top

08-20 00:58