代码之家  ›  专栏  ›  技术社区  ›  Emily

带标签的多级饼图

  •  3
  • Emily  · 技术社区  · 7 年前

    我在Rappid上找到这张照片( https://resources.jointjs.com/docs/rappid/v2.2/shapes.html#shapes.chart.pie )我想用我自己的数据用R来模拟它。我对图例和标签特别感兴趣,因为一个相关的问题没有涉及到这一点( Multi-level Pie Chart in R )

    labeled multi-level pie chart from Rappid site

    下面是一些示例代码:

    df <- data.frame(year = c(2014, 2014, 2014, 2014, 2014, 2013, 2013, 2013, 2013, 2013, 2012, 2012, 2012, 2012, 2012),
                 browser = c("IE", "Firefox", "Chrome", "Safari", "Opera","IE", "Firefox", "Chrome", "Safari","Opera", "IE", "Firefox", "Chrome", "Safari", "Opera"),
                 c = c("20.3", "18.3", "34.2", "17.8", "2.7", "27.5", "20.0","30.0", "14.8", "2.3", "30.9", "24.8", "24.6", "6.5","2.5"))
    
    3 回复  |  直到 7 年前
        1
  •  4
  •   eipi10    7 年前

    这是一个带有ggplot2的堆叠饼图。数据中的百分比并没有在每年内达到100%,因此为了本例的目的,我将其缩放到100%(如果您的真实数据没有用尽所有选项,您可以添加一个“其他”类别)。我还更改了列的名称 c cc 自从 c 是一个R函数。

    library(tidyverse)
    
    # Convert cc to numeric
    df$cc = as.numeric(as.character(df$cc))
    
    # Data for plot
    pdat = df %>% 
      group_by(year) %>% 
      mutate(cc = cc/sum(cc)) %>% 
      arrange(browser) %>% 
      # Get cumulative value of cc
      mutate(cc_cum = cumsum(cc) - 0.5*cc) %>% 
      ungroup
    
    ggplot(pdat, aes(x=cc_cum, y=year, fill=browser)) +
      geom_tile(aes(width=cc), colour="white", size=0.4) +
      geom_text(aes(label=sprintf("%1.1f", 100*cc)), size=3, colour="white") +
      geom_text(data=pdat %>% filter(year==median(year)), size=3.5, 
                aes(label=browser, colour=browser), position=position_nudge(y=0.5)) +
      scale_y_continuous(breaks=min(pdat$year):max(pdat$year)) +
      coord_polar() +
      theme_void() +
      theme(axis.text.y=element_text(angle=0, colour="grey40", size=9),
            axis.ticks.y=element_line(),
            axis.ticks.length=unit(0.1,"cm")) +
      guides(fill=FALSE, colour=FALSE) +
      scale_fill_manual(values=hcl(seq(15,375,length=6)[1:5],100,70)) +
      scale_colour_manual(values=hcl(seq(15,375,length=6)[1:5],100,50))
    

    enter image description here

    您还可以使用堆叠条形图,它可能更清晰:

    ggplot(pdat, aes(x=cc_cum, y=year, fill=browser)) +
      geom_tile(aes(width=cc), colour="white") +
      geom_text(aes(label=sprintf("%1.1f", 100*cc)), size=3, colour="white") +
      geom_text(data=pdat %>% filter(year == min(year)), size=3.2, 
                aes(label=browser, colour=browser), position=position_nudge(y=-0.6)) +
      scale_y_continuous(breaks=min(df$year):max(df$year)) +
      scale_x_continuous(expand=c(0,0)) +
      theme_void() +
      theme(axis.text.y=element_text(angle=0, colour="grey40", size=9),
            axis.ticks.y=element_line(),
            axis.ticks.length=unit(0.1,"cm")) +
      guides(fill=FALSE, colour=FALSE) +
      scale_fill_manual(values=hcl(seq(15,375,length=6)[1:5],100,70)) +
      scale_colour_manual(values=hcl(seq(15,375,length=6)[1:5],100,50))
    

    enter image description here

    线条图可能是最清晰的:

    library(scales)
    
    ggplot(pdat, aes(year, cc, colour=browser)) +
      geom_line() +
      geom_label(aes(label=sprintf("%1.1f", cc*100)), size=3,
                 label.size=0, label.padding=unit(1,"pt"), , colour="white") +
      geom_text(aes(label=sprintf("%1.1f", cc*100)), size=3) +
      geom_text(data=pdat %>% filter(year==max(year)), 
                aes(label=browser), hjust=0, nudge_x=0.08, size=3) +
      theme_classic() +
      expand_limits(x=max(pdat$year) + 0.3, y=0) +
      guides(colour=FALSE) +
      scale_x_continuous(breaks=min(pdat$year):max(pdat$year)) +
      scale_y_continuous(labels=percent)
    

    enter image description here

        2
  •  4
  •   pogibas    7 年前

    另一个解决方案是 创建两个绘图 并将它们合并为一个。

    # Modify your data
    
    # Turn c to numeric (as @eipi10 has mentioned don't use c)
    df$Y <- as.numeric(as.character(df$c))
    
    # Create second dummy legend/plot
    # Rows for year
    foo <- data.frame(cumsum(table(df$year)) + 1:length(unique(df$year)))
    foo$year <- rownames(foo)
    colnames(foo)[1] <- "row"
    # Rows for browsers
    df$row <- which(do.call(rbind, by(df, df$year, rbind, ""))$year != "")
    
    colors <- c("#56B998", "#ec3f52", "#8ac8ff", "#8a768a", "#E5CF00")
    library(ggplot2)
    p1 <- ggplot(df, aes(factor(year), Y, fill = browser)) + 
        geom_bar(stat = "identity", width = 1, size = 1, color = "white") +
        coord_polar("y") + 
        theme_void() +
        theme(legend.position = "none") +
        scale_fill_manual(values = colors)
    p2 <- ggplot(df, aes(y = row)) + 
        geom_point(aes(0, color = browser), size = 4) +
        geom_text(data = foo, aes(0, label = rev(year)), size = 5, color = "grey50") +
        geom_text(aes(0.5, label = paste0(browser, ": ", c, "%"))) +
        theme_void() +
        theme(legend.position = "none") +
        scale_x_discrete() +
        scale_color_manual(values = colors)
    
    # Combine two plots
    library(egg)
    ggarrange(p1, p2, nrow = 1, widths = c(3, 1))
    

    enter image description here

        3
  •  1
  •   Jaap    7 年前

    另一种选择是使用 ggforce -包装:

    library(dplyr)
    
    df2 <- df %>% 
      mutate(r0 = (year - 2012)/n_distinct(year),
             r1 = (year - 2011)/n_distinct(year)) %>% 
      group_by(year) %>% 
      mutate(ends = 2 * pi * cumsum(share)/sum(share),
             starts = lag(ends, default = 0),
             mids = 0.5*(starts + ends))
    
    library(ggforce)
    
    ggplot(df2) +
      geom_arc_bar(aes(x0 = 0, y0 = 0, r0 = r0, r = r1, start = starts, end = ends, fill = browser), color = 'white') +
      geom_text(aes(x = (r1+r0)*sin(mids)/2, y = (r1+r0)*cos(mids)/2, label = lbl)) +
      coord_fixed() +
      labs(title = 'Browser marketshare', x = NULL, y = NULL) +
      scale_y_continuous(breaks = (1:3)/3 - 1/6, labels = 2012:2014) +
      theme_minimal() +
      theme(panel.grid = element_blank(),
            axis.text.x = element_blank())
    

    其中给出:

    enter image description here