在ggplot2中构建双y轴图的函数

12

我正在测试一个在ggplot2中构建双y轴图形的函数。它可以工作,但我无法从输入图形中获取一些元素。我使用两个数据框Base1Base2构建了这两个图形(我在最后一部分添加了dput()版本):

library(ggplot2)
library(scales)
library(gtable)
#Graph 1
g1<-ggplot(Base1, aes(x = Month, y = value, fill = variable)) +
  geom_bar(stat="identity",colour="black",size=1) +
  scale_y_continuous(labels = comma,breaks=pretty_breaks(n=7),
                     limits=c(0,max(Base1$value,na.rm=T))) +
  theme(axis.text.x=element_text(angle=90,colour="grey20",face="bold",size=12),
        axis.text.y=element_text(colour="grey20",face="bold",hjust=1,vjust=0.8,size=15),
        axis.title.x=element_text(colour="grey20",face="bold",size=16),
        axis.title.y=element_text(colour="grey20",face="bold",size=16)) +
  xlab('Month')+ylab('')+ ggtitle("My graph") +
  theme(plot.title = element_text(lineheight=3, face="bold", color="black",size=24)) +
  theme(legend.text=element_text(size=14),
        legend.title=element_text(size=14)) +
  scale_fill_manual(name = "variable", 
                    label = "Power", 
                    values = "#FF6C91")  

enter image description here

第二个:

#Graph2
colors=c("red","darkgreen")
g2<-ggplot(Base2, aes(x=Month, y=value, color=variable))+ 
  geom_line(aes(group=variable),size=1.3) +
  geom_point(size=3.8, shape=21, fill="white") + 
  scale_color_manual(values=colors)+ ggtitle("My graph")

enter image description here

使用这两个图形,我使用了下一个函数来制作双y轴图表:

double_axis_graph <- function(graf1,graf2){
  graf1 <- graf1
  
  graf2 <- graf2
  
  
  
  gtable1 <- ggplot_gtable(ggplot_build(graf1))
  
  gtable2 <- ggplot_gtable(ggplot_build(graf2))
  
  
  
  par <- c(subset(gtable1[['layout']], name=='panel', select=t:r))
  
  graf <- gtable_add_grob(gtable1, gtable2[['grobs']][[which(gtable2[['layout']][['name']]=='panel')]],
                          
                          par['t'],par['l'],par['b'],par['r'])
  
  
  
  ia <- which(gtable2[['layout']][['name']]=='axis-l')
  
  ga <- gtable2[['grobs']][[ia]]
  
  ax <- ga[['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.15,'cm')
  
  graf <- gtable_add_cols(graf, gtable2[['widths']][gtable2[['layout']][ia, ][['l']]], length(graf[['widths']])-1)
  
  graf <- gtable_add_grob(graf, ax, par['t'], length(graf[['widths']])-1, par['b'])
  
  return(graf)
  
}

因此,当我使用它来构建双轴图时,结果显示了双轴,但我无法将输入图形中的其他元素作为完整的图例获取;此外,当我连接这些图形时,只显示其中一个,而另一个则丢失。我应用了该函数并得到了以下结果:

plot(double_axis_graph(g1,g2))

enter image description here

在这种情况下,条形图(g1)消失了,我无法使用g2中的元素完成图例。两个轴都正常工作。在第二次测试中,我得到了这个结果:
plot(double_axis_graph(g2,g1))

enter image description here

在这种情况下,我从g2中失去了系列,并且图例没有来自g1的元素。我想完善函数以显示图形中所有系列的图形和图例中的元素。
数据:
Base1 <- data.frame(
  Month = c("m11", "m12", "m13", "m14", "m15", "m16"),
  variable = factor(rep("Power", 6L)),
  value = c(28101696.45, 28606983.44, 30304944, 32583849.36, 34791542.82, 40051050.24)
)

Base2 <- data.frame(
  Month = rep(c("m11", "m12", "m13", "m14", "m15", "m16"), 2),
  variable = factor(rep(c("Index1", "Index2"), each = 6L)),
  value = c(
    0.044370892419913, 0.0437161234641523, 0.0516857394621815, 0.0495793011485982,
    0.0506456741259283, 0.0314653057147897, 0.0299405579124744,
    0.0296145768664101, 0.0269727649059507, 0.0250663815369419,
    0.0233469715385275, 0.0201801611981898
  )
)
3个回答

11

解决问题的第一步:

g1.1 <- g1 + theme_bw() + theme(legend.position="top")
g2.1 <- g2 + theme_bw() + theme(panel.grid=element_blank()) +
    theme(panel.background = element_rect(fill = NA))
plot(double_axis_graph(g1.1,g2.1))

输入图像描述

现在我们需要修复:

  • 到处都是奇怪的灰色背景 - 编辑:已修复!
  • 说明

并且要忍受哈德利的愤怒,因为所做的事情从根本上是有缺陷的。


感谢@ROLO,为了从g1和g2的图例中获取所有元素,需要构建另一个函数或者可能可以添加一些包装器到绘图中? - Duck
是的,我在考虑使用两个数据集制作一个名为 g3 的图,并添加完整的图例,从 g1g2 中删除图例,仅将 g3 的图例添加到最终图中。 - ROLO
谢谢@ROLO,但这对我来说有点复杂,你能否通过向图表添加图例来帮助我!我的函数还没有完成。 - Duck
我稍后有时间会看一下。 - ROLO
亲爱的@ROLO,也许你能帮我解决一下图例的问题吗?我已经尝试过了,但是没有得到预期的结果。谢谢。 - Duck
@ROLO 有什么办法可以添加y2轴标签吗? - sean

4

我使用了一位程序员的代码来构建我的这里

grid.newpage()

# two plots
p1 <- ggplot(fuel, aes(x=date, y=mpg)) + geom_line() + 
  theme_bw() + xlab("Date") + ylab("MPG (Black)")
p2 <- ggplot(fuel, aes(x=date, y=avg.temp)) + 
  xlab("Date") + ylab("AVG Temp (Red)") +
  geom_line(colour="red") + theme_bw() + 
  theme(axis.title.y=element_text(angle = -90)) %+replace% 
  theme(panel.background = element_rect(fill = NA))

# extract gtable
g1 <- ggplot_gtable(ggplot_build(p1))
g2 <- ggplot_gtable(ggplot_build(p2))

# overlap the panel of 2nd plot on that of 1st plot
pp <- c(subset(g1$layout, name == "panel", se = t:r))
g <- gtable_add_grob(g1, 
                     g2$grobs[[which(g2$layout$name == "panel")]], 
                     pp$t, pp$l, pp$b, pp$l)

# axis tweaks
alab <- g2$grobs[[which(g2$layout$name=="ylab")]]
ia <- which(g2$layout$name == "axis-l")
ga <- g2$grobs[[ia]]
ax <- ga$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.15, "cm")
g <- gtable_add_cols(g, g2$widths[g2$layout[ia, ]$l], 
                     length(g$widths) - 1 )
g <- gtable_add_cols(g, g2$widths[g2$layout[ia, ]$l], 
                     length(g$widths) - 1 )
g <- gtable_add_grob(g, ax, pp$t, length(g$widths) - 2, pp$b)
g <- gtable_add_grob(g, alab, pp$t, length(g$widths) - 1, pp$b)

grid.draw(g)

不错。但是没有合并的图例。 - ROLO

1

使用从这里得到的sec_axis更为智能的方法。

优点:

  1. 本地次要轴,仅创建一个ggplot对象。
  2. 不需要明确调整轴对象的任何操作。

缺点:必须预先定义两个轴的限制。

有关详细信息,请参阅sec_axis文档博客文章(日语)。

ggplot

# You must define limits first

AXIS1_MIN = 0
AXIS1_MAX = max(Base1$value)
AXIS2_MIN = min(Base2$value)
AXIS2_MAX = max(Base2$value)

scale_to_value1 <- function(values) rescale(values, to = c(AXIS1_MIN, AXIS1_MAX))
scale_to_value2 <- function(values) rescale(values, to = c(AXIS2_MIN, AXIS2_MAX))

ggplot() +
  geom_bar(aes(x = Month, y = value, fill = variable), data = Base1, stat="identity",colour="black",size=1) +
  geom_line(aes(x = Month, y = scale_to_value1(value),color = variable, group = variable), data = Base2, size=1.3) +
  scale_y_continuous(labels = comma,breaks=pretty_breaks(n=7),
                     limits=c(AXIS1_MIN, AXIS1_MAX),
                     sec.axis = sec_axis( ~ scale_to_value2(.), name = "value2")) +
  scale_color_manual(name = "variable", 
                    label = c("Index1", "Index2"), 
                    values = c("Index1" = "red", "Index2" = "green")) +
  scale_fill_manual(name = "variable", 
                    label = "Power",
                    values = "#FF6C91") +
  theme(axis.text.x=element_text(angle=90,colour="grey20",face="bold",size=12),
        axis.text.y=element_text(colour="grey20",face="bold",hjust=1,vjust=0.8,size=15),
        axis.title.x=element_text(colour="grey20",face="bold",size=16),
        axis.title.y=element_text(colour="grey20",face="bold",size=16)) +
  xlab('Month')+ylab('')+ ggtitle("My graph") +
  theme(plot.title = element_text(lineheight=3, face="bold", color="black",size=24)) +
  theme(legend.text=element_text(size=14),
        legend.title=element_text(size=14))

网页内容由stack overflow 提供, 点击上面的
可以查看英文原文,
原文链接