美文网首页作图R语言做图R语言
R 数据可视化 —— 绘制多个 Y 轴(补充)

R 数据可视化 —— 绘制多个 Y 轴(补充)

作者: 名本无名 | 来源:发表于2021-11-18 17:49 被阅读0次

    前言

    上一节所介绍的绘制多个 Y 轴,只能在图形的右侧依次添加 Y 轴。

    Y 轴数量过多的情况下(当然,轴不应该太多),将轴平均地放置在左右两侧会更美观些。

    因此,这节主要介绍如何在图形的左侧添加 Y

    添加 Y 轴

    总的来说,将 Y 轴添加到左侧会更简单,不需要对坐标轴、刻度标签及轴标签进行转换。主要获取到轴对象及轴标签对象,将其添加到左侧即可。

    对于下面两张图

    colors <- c('#5470C6', '#91CC75', '#EE6666', '#ff7f00')
    data <- data.frame(
      category = factor(substr(month.name, 1, 3), levels = substr(month.name, 1, 3)),
      Evaporation = c(2.0, 4.9, 7.0, 23.2, 25.6, 76.7, 135.6, 162.2, 32.6, 20.0, 6.4, 3.3),
      Precipitation = c(2.6, 5.9, 9.0, 26.4, 28.7, 70.7, 175.6, 182.2, 48.7, 18.8, 6.0, 2.3),
      Temperature = c(2.0, 2.2, 3.3, 4.5, 6.3, 10.2, 20.3, 23.4, 23.0, 16.5, 12.0, 6.2)
    )
    
    p1 <- ggplot(data, aes(category, Evaporation)) + 
      geom_col(fill = colors[1], width = 0.3, position = position_nudge(x = -0.2)) + 
      labs(x = "month", y = "Evaporation(ml)") +
      scale_y_continuous(limits = c(0, 250), expand = c(0,0)) +
      theme(
            axis.text.y = element_text(color = colors[1]), 
            axis.ticks.y = element_line(color = colors[1]), 
            axis.title.y = element_text(color = colors[1]), 
            axis.line.y = element_line(color = colors[1]), 
            axis.line.x = element_line(color = "black"),
            axis.text.x = element_text(angle = 45, hjust = 1, vjust = 1)
      )
    p1
    
    p2 <- ggplot(data, aes(category, Precipitation)) + 
      geom_col(fill = colors[2], width = 0.3, position = position_nudge(x = 0.2)) + 
      labs(x = "month", y = "Precipitation(ml)") +
      scale_y_continuous(limits = c(0, 250), expand = c(0,0))  +
      theme( 
            axis.text.y = element_text(color = colors[2]), 
            axis.ticks.y = element_line(color = colors[2]), 
            axis.title.y = element_text(color = colors[2]), 
            axis.line.y = element_line(color = colors[2]), 
            axis.text.x = element_text(angle = 45, hjust = 1, vjust = 1)
      )
    p2
    

    获取 gtable 对象

    my_theme <- theme(panel.grid = element_blank(), panel.background = element_rect(fill = NA))
    
    g1 <- ggplotGrob(p1 + my_theme)
    g2 <- ggplotGrob(p2 + my_theme)
    

    合并主绘图区域的代码是一样的

    pos <- c(subset(g1$layout, name == "panel", select = t:r))
    
    g1 <- gtable_add_grob(g1, g2$grobs[[which(g2$layout$name == "panel")]], 
                          pos$t, pos$l, pos$b, pos$l)
    plot(g1)
    

    获取 Y 轴及 Y 轴标签的位置信息

    index <- which(g2$layout$name == "axis-l")
    yaxis <- g2$grobs[[index]]
    
    pos <- c(subset(g1$layout, name == "ylab-l", select = t:r))
    

    首先,添加一个 3mm 的空白间距。注意是在轴标签位置的左侧添加是(pos$l - 1

    g <- gtable_add_cols(g1, unit(3, "mm"), pos$l - 1)
    

    然后将 Y 轴添加到一个新的列

    g <- gtable_add_cols(g, g2$widths[g2$layout[index, ]$l], pos$l - 1)
    g <- gtable_add_grob(g, yaxis, pos$t, pos$l, pos$b, pos$l, clip = "off")
    plot(g)
    

    添加轴标签也是类似的

    index <- which(g2$layout$name == "ylab-l")
    ylab <- g2$grobs[[index]]
    g <- gtable_add_cols(g, g2$widths[g2$layout[index, ]$l], pos$l - 1)
    g <- gtable_add_grob(g, ylab, pos$t, pos$l, pos$b, pos$l, clip = "off")
    

    这样就可以啦。

    我们可以将上次的代码改写,使其可以根据传入图形的数量来决定轴的添加位置。改写的代码如下

    library(ggplot2)
    library(gtable)
    library(grid)
    
    
    hinvert_title_grob <- function(grob){
      # 交换宽度
      widths <- grob$widths
      grob$widths[1] <- widths[3]
      grob$widths[3] <- widths[1]
      grob$vp[[1]]$layout$widths[1] <- widths[3]
      grob$vp[[1]]$layout$widths[3] <- widths[1]
      
      # 修改对齐
      grob$children[[1]]$hjust <- 1 - grob$children[[1]]$hjust 
      grob$children[[1]]$vjust <- 1 - grob$children[[1]]$vjust 
      grob$children[[1]]$x <- unit(1, "npc") - grob$children[[1]]$x
      grob
    }
    
    左侧添加轴
    add_yaxis_left <- function(g1, g2) {
      # 添加轴
      pos <- c(subset(g1$layout, name == "ylab-l", select = t:r))
      index <- which(g2$layout$name == "axis-l")
      yaxis <- g2$grobs[[index]]
      g <- gtable_add_cols(g1, unit(3, "mm"), pos$l - 1)
      g <- gtable_add_cols(g, g2$widths[g2$layout[index, ]$l], pos$l - 1)
      g <- gtable_add_grob(g, yaxis, pos$t, pos$l, pos$b, pos$l, clip = "off")
      # 添加轴标签
      # pos <- c(subset(g1$layout, name == "ylab-l", select = t:r))
      index <- which(g2$layout$name == "ylab-l")
      ylab <- g2$grobs[[index]]
      g <- gtable_add_cols(g, g2$widths[g2$layout[index, ]$l], pos$l - 1)
      g <- gtable_add_grob(g, ylab, pos$t, pos$l, pos$b, pos$l, clip = "off")
      g
    }
    # 右侧添加轴
    add_yaxis_right <- function(g1, g2, pos) {
      # ============ 2. 轴标签 ============ #
      index <- which(g2$layout$name == "ylab-l")
      ylab <- g2$grobs[[index]]
      ylab <- hinvert_title_grob(ylab)
      # 添加轴标签
      g <- gtable_add_cols(g1, g2$widths[g2$layout[index, ]$l], pos$r)
      g <- gtable_add_grob(g, ylab, pos$t, pos$r + 1, pos$b, pos$r + 1, clip = "off", name = "ylab-r")
      # ============ 3. 轴设置 ============ #
      index <- which(g2$layout$name == "axis-l")
      yaxis <- g2$grobs[[index]]
      # 将 Y 轴线移动到最左边
      yaxis$children[[1]]$x <- unit.c(unit(0, "npc"), unit(0, "npc"))
      # 交换刻度线和刻度标签
      ticks <- yaxis$children[[2]]
      ticks$widths <- rev(ticks$widths)
      ticks$grobs <- rev(ticks$grobs)
      # 移动刻度线
      ticks$grobs[[1]]$x <- ticks$grobs[[1]]$x - unit(1, "npc") + unit(3, "pt")
      # 刻度标签位置转换和对齐
      ticks$grobs[[2]] <- hinvert_title_grob(ticks$grobs[[2]])
      yaxis$children[[2]] <- ticks
      # 添加轴,unit(3, "mm") 增加轴间距
      g <- gtable_add_cols(g, g2$widths[g2$layout[index, ]$l] + unit(3, "mm"), pos$r)
      g <- gtable_add_grob(g, yaxis, pos$t, pos$r + 1, pos$b, pos$r + 1, clip = "off", name = "axis-r")
      g
    }
    
    add_yaxis <- function(g1, g2, offset = 0) {
      # ============ 1. 主绘图区 ============ #
      # 获取主绘图区域
      pos <- c(subset(g1$layout, name == "panel", select = t:r))
      # 添加图形
      g1 <- gtable_add_grob(g1, g2$grobs[[which(g2$layout$name == "panel")]], 
                           pos$t, pos$l, pos$b * ((offset - 2) * 0.00001 + 1), pos$l)
      if (offset > 3 && offset %% 2 == 0) {
        g1 <- add_yaxis_left(g1, g2)
      } else {
        g1 <- add_yaxis_right(g1, g2, pos)
      }
      g1
    }
    
    # 接受可变参数,可添加多个 Y 轴
    plot_multi_yaxis <- function(..., right_label_reverse = TRUE) {
      args <- list(...)
      my_theme <- theme(panel.grid = element_blank(), panel.background = element_rect(fill = NA))
      len <- length(args)
      args[[1]] <- args[[1]] + my_theme
      g <- ggplotGrob(args[[1]])
      for (i in len:2) { 
        if (i < 4 || i %% 2 && right_label_reverse) {
          # 为轴标签添加旋转
          args[[i]] <- args[[i]] + 
            theme(axis.title.y = element_text(angle = 270))
        }
        args[[i]] <- args[[i]] + my_theme
        # 获取 gtable 对象
        g2 <- ggplotGrob(args[[i]])
        g <- add_yaxis(g, g2, offset = i)
      }
      # 绘制图形
      grid.newpage()
      grid.draw(g)
    }
    

    GitHub 代码也更新为该版本:
    https://github.com/dxsbiocc/learn/blob/main/R/plot/plot_multi_yaxis.R

    测试效果

    先添加第三张图

    p3 <- ggplot(data, aes(category, Temperature, group = 1)) + 
      geom_line(colour = colors[3]) + 
      geom_point(aes(colour = colors[3]), fill = "white", shape = 21, show.legend = FALSE) +
      scale_y_continuous(limits = c(0, 25), expand = c(0,0)) +
      labs(x = "month", y = expression(paste("Temperature (", degree, " C)"))) +
      theme(
            axis.text.y = element_text(color = colors[3]), 
            axis.ticks.y = element_line(color = colors[3]), 
            axis.title.y = element_text(color = colors[3]), 
            axis.line.y = element_line(color = colors[3]), 
            axis.text.x = element_text(angle = 45, hjust = 1, vjust = 1)
      )
    

    合并三张图

    plot_multi_yaxis(p1, p2, p3)
    

    再添加第四张图

    library(dplyr)
    
    set.seed(100)
    
    p4 <- mutate(data, Temperature = rev(Temperature) + rnorm(12)) %>%
      ggplot(aes(category, Temperature, group = 1)) + 
      geom_line(colour = colors[4]) + 
      geom_point(aes(colour = colors[4]), fill = "white", shape = 21, show.legend = FALSE) +
      scale_y_continuous(limits = c(0, 25), expand = c(0,0)) +
      labs(x = "month", y = expression(paste("Temperature (", degree, " C)"))) +
      theme(
        axis.text.y = element_text(color = colors[4]), 
        axis.ticks.y = element_line(color = colors[4]), 
        axis.title.y = element_text(color = colors[4]), 
        axis.line.y = element_line(color = colors[4]), 
        axis.text.x = element_text(angle = 45, hjust = 1, vjust = 1)
      )
    

    合并四张图

    plot_multi_yaxis(p1, p2, p3, p4)
    

    再添加两张,当然这样做是没什么道理的。只是为了说明函数依然能够完美工作

    plot_multi_yaxis(p1, p2, p3, p4, p1, p2)
    

    相关文章

      网友评论

        本文标题:R 数据可视化 —— 绘制多个 Y 轴(补充)

        本文链接:https://www.haomeiwen.com/subject/dozdtrtx.html