12.16 岭线图
ggridges 包,于淼 对此图形的来龙去脉做了比较系统的阐述,详见统计之都主站文章叠嶂图的前世今生
library(ggridges)
ggplot(lincoln_weather, aes(x = `Mean Temperature [F]`, y = Month, fill = stat(x))) +
geom_density_ridges_gradient(scale = 3, rel_min_height = 0.01, gradient_lwd = 1.) +
scale_x_continuous(expand = c(0, 0)) +
scale_y_discrete(expand = expansion(mult = c(0.01, 0.25))) +
scale_fill_viridis_c(name = "Temp. [F]", option = "C") +
labs(
title = 'Temperatures in Lincoln NE',
subtitle = 'Mean temperatures (Fahrenheit) by month for 2016'
+
) theme_ridges(font_size = 13, grid = TRUE) +
theme(axis.title.y = element_blank())
data:image/s3,"s3://crabby-images/cc09f/cc09f59bd392d3c866228473e0b052f81d6cdf91" alt="2016年在内布拉斯加州林肯市的天气变化"
图 12.55: 2016年在内布拉斯加州林肯市的天气变化
通过数据可视化的手段帮助肉眼检查两组数据的分布
<- ggplot(sleep, aes(x = extra, y = group, fill = group)) +
p1 geom_density_ridges() +
theme_ridges()
<- ggplot(diamonds, aes(x = price, y = color, fill = color)) +
p2 geom_density_ridges() +
theme_ridges()
/ p2 p1
data:image/s3,"s3://crabby-images/c91d5/c91d5b9d36a68e56350300bfe8d28f614e81002f" alt="比较数据的分布"
图 12.56: 比较数据的分布
ridgeline 提供 Base R 绘图方案
data:image/s3,"s3://crabby-images/b896c/b896c2251109c72bd5eee2a2eb45eeedbbdc76bd" alt="岭线图"
图 12.57: 岭线图