查看原文
其他

哥俩好-ggplot2绘制配对条形图

ANERYAN R语言数据分析指南 2023-06-15

欢迎关注R语言数据分析指南

本节来介绍如何使用「ggplot2」包绘制配对条形图,下面通过一个小案例进行展示

安装并加载R包

package.list=c("tidyverse","ggtext","ggnewscale","scico")

for (package in package.list) {
  if (!require(package,character.only=T, quietly=T)) {
    install.packages(package)
    library(package, character.only=T)
  }
}

加载数据

big_dave <- readr::read_csv('big_dave.csv')
times <- readr::read_csv('times.csv')

数据清洗

df1 <- big_dave %>%
  filter(!is.na(definition)) %>%
  mutate(definition = str_to_lower(definition)) %>% 
  count(definition, sort=T) %>% 
  mutate(pct=n/sum(n)) %>%
  mutate(g=1,grp="Big Dave's") %>% slice(1:20)

df2 <- times %>% 
  filter(!is.na(definition)) %>%
  mutate(definition = str_to_lower(definition)) %>% 
  count(definition, sort=T)  %>% 
  mutate(pct=n/sum(n)) %>%
  mutate(g=2,grp="Times") %>% slice(1:20)

数据合并

df = rbind(df1,df2) %>% group_by(grp) %>%
  mutate(rank=rank(desc(n),ties.method = 'first')) %>%
  ungroup()

筛选部分数据

selected = df %>% select(definition, g) %>% 
  count(definition) %>%filter(n==2) %>% pull(definition)

数据可视化

df %>% ggplot(aes(x=g, y=rank)) +
  geom_text(aes(label=definition, hjust=ifelse(g==1,1,0))) +
  geom_line(data=df %>% filter(definition %in% selected),aes(group=definition)) +
  geom_segment(data=df %>% filter(g==2),
               aes(x=g+.8, xend=g+.8+pct*600, y=rank, yend=rank, color=pct), size=5) +
  geom_segment(data=df %>% filter(g==1),
               aes(x=g-.8, xend=g-.8-pct*600, y=rank, yend=rank, color=pct), size=5) +
  scico::scale_color_scico(palette="acton", direction=-1) +
  ggnewscale::new_scale_color() +
  geom_text(data=df %>% 
              filter(g==2),aes(x=g+0.85,y=rank,color=I(ifelse(pct>0.0015,"white","black")), 
                               abel=scales::percent(pct, accuracy = .01)),size=3, hjust=0) +
  ggnewscale::new_scale_color() +
  geom_text(data=df %>% filter(g==1),
            aes(x=g-0.85, y=rank, color=I(ifelse(pct>0.0014,"white","black")), 
                label=scales::percent(pct, accuracy = .01)), size=3, hjust=1) +
  annotate(geom="text",y=-.3,x=0.68, label="Big Dave's",size=4.3, fontface="bold") +
  annotate(geom="text",y=-.3,x=2.2, label="Times",size=4.3, fontface="bold") +
  scale_y_reverse() +
  scale_x_continuous(limits=c(-1.5,4.5), expand=c(0,0)) +
  theme_void()+
  theme(legend.position = "none",plot.margin=margin(.1,.1,.1,.1,unit="cm"))

数据获取

本节内容到此结束,喜欢的小伙伴欢迎转发此文档附上一句话到朋友圈「30分钟后后台截图给我」,即可获取对应的数据及代码,如未及时回复可添加我的微信

欢迎大家扫描下方二位码加入「QQ交流群」,与全国各地上千位小伙伴交流

「关注下方公众号下回更新不迷路」,如需要加入微信交流群可添加小编微信,请备注单位+方向+姓名

往期推荐

circlize优雅的绘制多重注释弦图

跟着Nature学绘图(3) 再谈ggplot2绘制热图

跟着论文学习ggplot2绘图

跟着Nature学绘图(2) 箱线图-累积分布曲线图

跟着Nature学绘图(1) 热图|散点图

R包安装终极方案

手把手教你绘制ggplot版circlize图

ggplot2优雅的绘制网络图

手把手教你计算旁系同源基因ka/ks值

R进行三因素方差分析

使用rstatix优雅的进行统计分析

R优雅的进行多因素方差分析

ggplot2优雅的绘制旭日图

ggplot2绘制美美的花瓣图

ggplot2绘制美美的月亮图

您可能也对以下帖子感兴趣

文章有问题?点此查看未经处理的缓存