跟着PNAS学作图 | 提供全文数据和代码

论文

题目:Death rates at specific life stages mold the sex gap in life expectancy

网址: https://www.pnas.org/doi/full/10.1073/pnas.2010588118

代码网址

https://github.com/CPop-SDU/sex-gap-e0-pnas

该文章发表于2021年,论文中图形对我们一部分同学仍具参考价值。作者提供的全套的代码和数据,可以直接使用。此外,作者的数据和代码写的非常的规整。但是,需要看懂和运行代码,还是需要有一定的基础。

论文主图

论文主图仅有两张,如下图所示。



代码

Figure 1


# function to localize paths

devtools::source_gist("32e9aa2a971c6d2682ea8d6af5eb5cde")

# prepare session
source(lp("0-prepare-session.R"))


# theme -------------------------------------------------------------------
load("../dat/palettes.rda" %>% lp)

theme_custom <- theme_minimal(base_family = font_rc) +
    theme(
        legend.position = "bottom",
        strip.background = element_blank(),
        strip.text = element_blank(),
        panel.grid.minor =  element_blank(),
        panel.grid.major =  element_line(size = .25),
        panel.ontop = T
    )

作者将相关的代码编写在其他的R脚本中,使用时直接进行调用。
[图片上传失败...(image-122af8-1680158585814)]

# Fig 1 -- RELATIVE ----------------------------------
load("../dat/a6gap33cntrs.rda" %>% lp)

# relative
df6 %>% 
    filter(country %>% is_in(c("SWE", "USA", "JPN", "RUS"))) %>%
    mutate(
        name = name %>% 
            fct_recode(USA = "United States") %>% 
            fct_rev()
    ) %>%
    ggplot() +
    geom_col(
        aes(year, ctb_rel %>% multiply_by(100), fill = age_group),
        position = position_stack(reverse = TRUE),
        color = NA,
        width = 1
    ) +
    facet_grid(name ~ ., scales = "free_y", space = "free") +
    coord_cartesian(ylim = c(-10, 120), expand = FALSE)+
    scale_x_continuous(breaks = seq(1800, 2000, 50))+
    scale_y_continuous(breaks = seq(0, 100, 25), position = "right")+
    scale_fill_manual(
        values = pal_six, 
        guide  = guide_legend(ncol = 1, reverse = TRUE)
    ) +
    theme_minimal(base_family = font_rc, base_size = 20) +
    theme(
        legend.position = c(.6, .5),
        strip.background = element_blank(),
        strip.text = element_blank(),
        panel.grid.minor =  element_blank(),
        panel.grid.major =  element_line(size = .1),
        panel.spacing = unit(0, "lines"),
        panel.ontop = T
    )+
    labs(x = NULL,
         y = "Contribution, %",
         fill = "Age group")+
    # label countries
    geom_text(data = . %>% select(name, row, column) %>%  distinct(),
              aes(label = name, color = name), 
              x = 2015, y = 120, 
              hjust = 1, vjust = 1, size = 9, fontface = 2,
              family = font_rc)+
    scale_color_manual(values = pal_four %>% rev, 
                       guide = FALSE)

one_outer <- last_plot()
one_outer

# plot ratio
load("../dat/df4qx.rda" %>% lp)

df4qx %>%
    pivot_wider(names_from = sex, values_from = qx) %>% 
    ggplot(aes(age, y = m/f, color = country))+
    geom_hline(yintercept = 1, color = "gray25",  size = .5)+
    geom_smooth(se = F, size = 1, color = "#ffffff", span = .25)+
    geom_smooth(se = F, size = .5, span = .25)+
    scale_x_continuous(breaks = c(0, 15, 40, 60, 80))+
    scale_y_continuous(
        trans = "log", 
        breaks = c(.5, 1, 2, 3), 
        labels = c("", 1, 2, 3),
        limits = c(.75, 3.5)
    )+
    scale_color_manual(NULL, values = pal_four)+
    theme_minimal(base_family = font_rc, base_size = 16)+
    theme(
        legend.position = "none",
        panel.grid.minor = element_blank()
    )+
    labs(
        y = "Sex ratio, log scale",
        x = "Age"
    )+
    annotate(
        "text", x = 50, y = .9, 
        label = "Most recent year",
        size = 8.5, color = "grey50", alpha = .5,
        vjust = 1, family = font_rc, fontface = 2
    )

one_a <- last_plot()
one_a
# Death risk Ratio, Sweden, years 1750, 1800, 1850, 1900, 1960, 2019
# plot qx
load("../dat/qxdiff.rda" %>% lp)

qxdiff %>% 
    filter(country == "SWE", 
           year %>% is_in(c(1800, 1900, 1960, 2019 ))) %>% 
    ggplot(aes(age, y = ratio, color = year %>% factor))+
    geom_hline(yintercept = 1, color = "gray25",  size = .5)+
    geom_smooth(se = F, size = .75, span = .4)+
    scale_x_continuous(breaks = c(0, 15, 40, 60, 80))+
    scale_y_continuous(
        trans = "log", 
        breaks = c(.5, 1, 2, 3), 
        labels = c("", 1, 2, 3),
        limits = c(.75, 3.5)
    )+
    scale_color_viridis_d(end = .97)+
    theme_minimal(base_family = font_rc, base_size = 16)+
    theme(
        legend.position = c(.85, .75),
        legend.spacing.x = unit(.1, "line"),
        legend.key.height = unit(1, "line"),
        panel.grid.minor = element_blank()
    )+
    labs(
        color = "Year",
        y = "Sex ratio, log scale",
        x = "Age"
    )+
    annotate(
        "text", x = 50, y = .9, 
        label = "Sweden",
        size = 8.5, color = "#009C9C", 
        vjust = 1, family = font_rc, fontface = 2
    )

one_b <- last_plot()
one_b

# plot difference
df4qx %>%
    pivot_wider(names_from = sex, values_from = qx) %>% 
    ggplot(aes(x = age, y = m - f, color = country, group = country)) +
    geom_path(size = .5)+
    scale_color_manual(NULL, values = pal_four)+
    scale_x_continuous(breaks = c(0, 15, 40, 60, 80))+
    scale_y_continuous(
        trans = "log",
        breaks = c(.0001, .001, .01, .05),
        labels = c(.0001, .001, .01, .05) %>% paste %>% str_replace("0.", "."),
        limits = c(9e-6, .1)
    )+
    theme_minimal(base_family = font_rc, base_size = 16)+
    theme(legend.position = c(.77, .25),
          legend.spacing.x = unit(.1, "line"),
          legend.key.height = unit(1, "line"),
          legend.text = element_text(size = 16),
          panel.grid.minor = element_blank())+
    labs(
        y = "Sex gap, log scale",
        x = "Age"
    )

one_c <- last_plot()
one_c

# arrange and save
blank <- ggplot(tibble(x = 1, y = 1), aes(x, y))+
    geom_rect(xmin = -Inf, xmax = Inf,
              ymin = -Inf, ymax = Inf,
              fill = "#ffffff",
              color = NA)+
    theme_void()

library(cowplot)
one <- ggdraw() +
    draw_plot(one_outer) +
    # white space for plots
    draw_plot(blank, x = 0, y = .75, width = 0.7, height = 0.25)+
    draw_plot(blank, x = 0, y = .55, width = 0.33, height = 0.42)+
    draw_plot(blank, x = 0, y = .33, width = 0.33, height = 0.67)+
    # inset plots
    draw_plot(one_a, x = 0, y = .66, width = .33, height = .33)+
    draw_plot(one_c, x = .34, y = .66, width = .33, height = .33)+
    draw_plot(one_b, x = 0, y = 0.35, width = .33, height = .33)+
    # annotate plot letters
    draw_text(
        LETTERS[c(1,3,2,4)],  
        x = c(.01, .35, .01, .01),
        y = c(.99, .99, .66, .3), 
        hjust = 0,  vjust = 1, size = 20, 
        family = font_rc, fontface = 2
    )

ggsave(
    filename = "out/main-one.png" %>% lp, 
    plot = one, width = 10, height = 10, 
    type = "cairo-png"
)

**这样一连串的的就绘制出图1。但是,有多少同学可以知道作者绘制每个图形的数据类型是什么样呢?
**

如果大家有时间时间和精力可以可以试一下,如果不行,那么在本文的中点赞或留言,我们一起分开绘制每个图形,一起学习!!!!

附图

appendix-1b.png

appendix-1c.png

appendix-3.png

appendix-8.png

ENDING!!


往期文章:
1. 最全WGCNA教程(替换数据即可出全部结果与图形)

WGCNA分析 | 全流程分析代码 | 代码一

WGCNA分析 | 全流程分析代码 | 代码二

WGCNA分析 | 全流程代码分享 | 代码三


2. 精美图形绘制教程

精美图形绘制教程

小杜的生信筆記,主要发表或收录生物信息学的教程,以及基于R的分析和可视化(包括数据分析,图形绘制等);分享感兴趣的文献和学习资料!!

©著作权归作者所有,转载或内容合作请联系作者
  • 序言:七十年代末,一起剥皮案震惊了整个滨河市,随后出现的几起案子,更是在滨河造成了极大的恐慌,老刑警刘岩,带你破解...
    沈念sama阅读 202,607评论 5 476
  • 序言:滨河连续发生了三起死亡事件,死亡现场离奇诡异,居然都是意外死亡,警方通过查阅死者的电脑和手机,发现死者居然都...
    沈念sama阅读 85,047评论 2 379
  • 文/潘晓璐 我一进店门,熙熙楼的掌柜王于贵愁眉苦脸地迎上来,“玉大人,你说我怎么就摊上这事。” “怎么了?”我有些...
    开封第一讲书人阅读 149,496评论 0 335
  • 文/不坏的土叔 我叫张陵,是天一观的道长。 经常有香客问我,道长,这世上最难降的妖魔是什么? 我笑而不...
    开封第一讲书人阅读 54,405评论 1 273
  • 正文 为了忘掉前任,我火速办了婚礼,结果婚礼上,老公的妹妹穿的比我还像新娘。我一直安慰自己,他们只是感情好,可当我...
    茶点故事阅读 63,400评论 5 364
  • 文/花漫 我一把揭开白布。 她就那样静静地躺着,像睡着了一般。 火红的嫁衣衬着肌肤如雪。 梳的纹丝不乱的头发上,一...
    开封第一讲书人阅读 48,479评论 1 281
  • 那天,我揣着相机与录音,去河边找鬼。 笑死,一个胖子当着我的面吹牛,可吹牛的内容都是我干的。 我是一名探鬼主播,决...
    沈念sama阅读 37,883评论 3 395
  • 文/苍兰香墨 我猛地睁开眼,长吁一口气:“原来是场噩梦啊……” “哼!你这毒妇竟也来了?” 一声冷哼从身侧响起,我...
    开封第一讲书人阅读 36,535评论 0 256
  • 序言:老挝万荣一对情侣失踪,失踪者是张志新(化名)和其女友刘颖,没想到半个月后,有当地人在树林里发现了一具尸体,经...
    沈念sama阅读 40,743评论 1 295
  • 正文 独居荒郊野岭守林人离奇死亡,尸身上长有42处带血的脓包…… 初始之章·张勋 以下内容为张勋视角 年9月15日...
    茶点故事阅读 35,544评论 2 319
  • 正文 我和宋清朗相恋三年,在试婚纱的时候发现自己被绿了。 大学时的朋友给我发了我未婚夫和他白月光在一起吃饭的照片。...
    茶点故事阅读 37,612评论 1 329
  • 序言:一个原本活蹦乱跳的男人离奇死亡,死状恐怖,灵堂内的尸体忽然破棺而出,到底是诈尸还是另有隐情,我是刑警宁泽,带...
    沈念sama阅读 33,309评论 4 318
  • 正文 年R本政府宣布,位于F岛的核电站,受9级特大地震影响,放射性物质发生泄漏。R本人自食恶果不足惜,却给世界环境...
    茶点故事阅读 38,881评论 3 306
  • 文/蒙蒙 一、第九天 我趴在偏房一处隐蔽的房顶上张望。 院中可真热闹,春花似锦、人声如沸。这庄子的主人今日做“春日...
    开封第一讲书人阅读 29,891评论 0 19
  • 文/苍兰香墨 我抬头看了看天上的太阳。三九已至,却和暖如春,着一层夹袄步出监牢的瞬间,已是汗流浃背。 一阵脚步声响...
    开封第一讲书人阅读 31,136评论 1 259
  • 我被黑心中介骗来泰国打工, 没想到刚下飞机就差点儿被人妖公主榨干…… 1. 我叫王不留,地道东北人。 一个月前我还...
    沈念sama阅读 42,783评论 2 349
  • 正文 我出身青楼,却偏偏与公主长得像,于是被迫代替她去往敌国和亲。 传闻我的和亲对象是个残疾皇子,可洞房花烛夜当晚...
    茶点故事阅读 42,316评论 2 342

推荐阅读更多精彩内容