= faithful
data datatable(data,rownames = FALSE)
author: 221527119陈银慧
解释原始数据
faithful
是R语言中自带的一个经典数据集,它记录了美国黄石国家公园老忠实间歇泉(Old Faithful geyser)的喷发数据。这个数据集经常被用于统计教学和数据分析示例。faithful
数据集包含两个变量,共有272个观测值。eruptions
: 喷发持续时间,连续数值变量,以分钟为单位,范围:1.6分钟到5.1分钟。waiting
: 两次喷发之间的等待时间,连续数值变量,以分钟为单位,范围:43分钟到96分钟。
单变量直方图
绘图要求
利用
geom_histogram(aes(y=..density..))
绘制eruptions
的直方图,使用预设主题:mytheme;利用
geom_rug()
为直方图添加地毯图;利用
geom_density()
为直方图添加核密度曲线;利用
annotate()
在直方图标注峰度和偏度信息;利用
geom_vline()
为直方图添加一条垂直的均值参考线;利用
geom_point()
在横轴上添加一个中位数参考点,并在点上方添加文字注释
作图代码
library(e1071) # 用于计算偏度系数和峰度系数
<- data
df # 作初始直方图,纵轴默认为频数
<-ggplot(data=df,aes(x=eruptions))+mytheme+ # 绘制直方图
h1geom_histogram(aes(y=..density..),fill="lightgreen",color="gray50")+
geom_rug(size=0.2,color="blue3")+
geom_density(color="blue2",size=0.7)+
annotate("text",x=2.5,y=0.7,label=paste0("偏度系数 =",round(skewness(df$eruptions),4)),size=3)+
annotate("text",x=2.5,y=0.6,label=paste0("峰度系数 =",round(kurtosis(df$eruptions),4)),size=3)+
geom_vline(xintercept=mean(df$eruptions),linetype="twodash",size=0.6,color="red")+ # 添加均值垂线,并设置线形、线宽和颜色
annotate("text",x=median(df$eruptions),y=0.7,label=paste0("均值线=",round(mean(df$eruptions),2)),size=3)+ # 添加注释文本
geom_point(x=median(df$eruptions),y=0,shape=21,size=4,fill="yellow")# 添加中位数点
Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
ℹ Please use `linewidth` instead.
h1
Warning: The dot-dot notation (`..density..`) was deprecated in ggplot2 3.4.0.
ℹ Please use `after_stat(density)` instead.
`stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
图形观察和代码编写的心得体会
- 这张图展示了某火山喷发持续时间的分布情况,从直方图的形态可以看出数据呈右偏分布(偏度系数0.4135),且峰度较低(-1.5116),说明数据较为分散。均值线位于3.49附近,但整体分布不对称,右侧存在少量较长喷发时间。
叠加直方图和镜像直方图
绘图要求
绘制
eruptions
和waiting
两个变量的叠加直方图和镜像直方图,使用预设主题:mytheme。将数据转化为长型数据再作叠加直方图,利用
scale_fill_brewer()
将叠加直方图配色方案改为set3
。镜像直方图中
eruptions
在正方向,waiting
在负方向,直方数bins=30
,并添加文字标签作标签。两种图都需要针对原始数据作图和标准标准化数据作图,可以使用
scale()
函数对变量标准化,分类标准化可以使用plyr::ddply()
函数。
叠加直方图代码
<- data|> select(eruptions,waiting) |>
df gather(eruptions,waiting,key=指标,value=指标值)%>%# 融合数据
ddply("指标",transform,标准化值=scale(指标值))
<-ggplot(df)+aes(x=指标值,y=..density..,fill=指标)+
p1geom_histogram(position="identity",color="gray60",alpha=0.5)+
scale_fill_brewer(palette = "Set3")+
theme(legend.position=c(0.8,0.8),# 设置图例位置
legend.background=element_rect(fill="grey90",color="grey"))+
# 设置图例背景色和边框颜色
ggtitle("(a) 原始数据叠加直方图叠加直方图")
Warning: A numeric `legend.position` argument in `theme()` was deprecated in ggplot2
3.5.0.
ℹ Please use the `legend.position.inside` argument of `theme()` instead.
<-ggplot(df)+aes(x=标准化值,y=..density..,fill=指标)+
p2geom_histogram(position="identity",color="gray60",alpha=0.5)+
scale_fill_brewer(palette = "Set3")+
theme(legend.position=c(0.8,0.8),# 设置图例位置
legend.background=element_rect(fill="grey90",color="grey"))+
# 设置图例背景色和边框颜色
ggtitle("(b) 原始数据叠加直方图叠加直方图")
grid.arrange(p1,p2,ncol=2)
`stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
`stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
镜像直方图代码
<-data|>
dfmutate(
std.eruptions=scale(eruptions),
std.waiting=scale(waiting)
)
<-ggplot(df)+aes(x=x)+
p1geom_histogram(aes(x=eruptions,y=..density..),bins=30,color="grey50",fill="red",alpha=0.3)+ # 绘制eruptions的直方图(上图)
geom_label(aes(x=30,y=0.2),label="eruptions",color="red")+ # 添加标签
geom_histogram(aes(x=waiting,y=-..density..),bins=30,color="grey50",fill="blue",alpha=0.3)+ # 绘制waiting的直方图(下图)
geom_label(aes(x=60,y=-0.1),label="waiting",color="blue")+ # 添加标签
xlab("指标值")+ggtitle("(c) eruptions和waiting的镜像直方图")
<-ggplot(df)+aes(x=x)+
p2geom_histogram(aes(x=std.eruptions,y=..density..),bins=30,color="grey50",fill="red",alpha=0.3)+ # 绘制std.eruptions的直方图(上图)
geom_label(aes(x=10,y=0.2),label="eruptions",color="red")+ # 添加标签
geom_histogram(aes(x=std.waiting,y=-..density..),bins=30,color="grey50",fill="blue",alpha=0.3)+ # 绘制std.waiting的直方图(下图)
geom_label(aes(x=10,y=-0.1),label="waiting",color="blue")+ # 添加标签
xlab("指标值")+ggtitle("(d) 标准化的镜像直方图")
::grid.arrange(p1,p2,ncol=2) # 组合图形 gridExtra
Warning in geom_label(aes(x = 30, y = 0.2), label = "eruptions", color = "red"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
Warning in geom_label(aes(x = 60, y = -0.1), label = "waiting", color = "blue"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
Warning in geom_label(aes(x = 10, y = 0.2), label = "eruptions", color = "red"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
Warning in geom_label(aes(x = 10, y = -0.1), label = "waiting", color = "blue"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
图形观察和代码编写的心得体会
叠加直方图:图(a)展示原始指标值下两指标分布,能看出 “eruptions” 和 “waiting” 分布差异明显,“eruptions” 集中在左侧,“waiting” 在右侧。图(b)是标准化值下的分布,将数据标准化后,更便于对比两者分布形态,可发现数据分布特征在标准化后呈现新的集中趋势。
镜像直方图:图(c)原始指标值的镜像直方图,将两指标分布在纵轴两侧展示,直观呈现各自分布范围和密度差异。图(d)标准化后的镜像直方图,通过标准化,消除原始数据量纲影响,能更清晰观察两者分布特征和相对关系,如分布的对称性、峰值位置等 。
核密度图
绘图要求
绘制eruptions和 waiting两个变量的分组核密度图、分面核密度图和镜像核密度图。
分组核密度图,采用
geom_density(position="identity")
。分面核密度图,采用
geom_density()+facet_wrap(~xx,scale="free")
。镜像核密度图中
eruptions
在正方向,waiting
在负方向,直方数bins=30
,并添加文字标签作标签。分组核密度图和镜像核密度图需要针对原始数据作图和标准标准化数据作图。
分组核密度图
<- data|> select(eruptions,waiting) |>
df gather(eruptions,waiting,key=指标,value=指标值)%>%# 融合数据
ddply("指标",transform,标准化值=scale(指标值))
# 图(a)叠加直方图
<-ggplot(df)+aes(x=指标值,y=..density..,fill=指标)+
p1geom_density(position="identity",color="gray60",alpha=0.5)+
scale_fill_brewer(palette = "Set3")+
theme(legend.position=c(0.8,0.8),# 设置图例位置
legend.background=element_rect(fill="grey90",color="grey"))+
# 设置图例背景色和边框颜色
ggtitle("(a) eruptions和waiting的叠加直方图")
# 图(b)镜像直方图
<-ggplot(df)+aes(x=标准化值,y=..density..,fill=指标)+
p2geom_density(position="identity",color="gray60",alpha=0.5)+
scale_fill_brewer(palette = "Set3")+
theme(legend.position=c(0.8,0.8),# 设置图例位置
legend.background=element_rect(fill="grey90",color="grey"))+
# 设置图例背景色和边框颜色
ggtitle("(b) 标准化数据叠加直方图")
::grid.arrange(p1,p2,ncol=2) # 组合图形 gridExtra
分面核密度图
ggplot(df)+aes(x=指标值,fill=指标)+
geom_density(color="gray60")+
scale_fill_brewer(palette="Set3")+# 设置调色板
guides(fill="none")+
facet_wrap(~指标,ncol=3,scale="free") # 按指标3列分面
镜像核密度图
<-data|>
dfmutate(
std.eruptions=scale(eruptions),
std.waiting=scale(waiting)
)
<-ggplot(df)+aes(x=x)+
p1geom_density(aes(x=eruptions,y=..density..),bins=30,color="grey50",fill="red",alpha=0.3)+ # 绘制eruptions的直方图(上图)
geom_label(aes(x=30,y=0.2),label="eruptions",color="red")+ # 添加标签
geom_density(aes(x=waiting,y=-..density..),bins=30,color="grey50",fill="blue",alpha=0.3)+ # 绘制waiting的直方图(下图)
geom_label(aes(x=60,y=-0.1),label="waiting",color="blue")+ # 添加标签
xlab("指标值")+ggtitle("(c) eruptions和waiting的镜像直方图")
Warning in geom_density(aes(x = eruptions, y = ..density..), bins = 30, :
Ignoring unknown parameters: `bins`
Warning in geom_density(aes(x = waiting, y = -..density..), bins = 30, color =
"grey50", : Ignoring unknown parameters: `bins`
<-ggplot(df)+aes(x=x)+
p2geom_density(aes(x=std.eruptions,y=..density..),bins=30,color="grey50",fill="red",alpha=0.3)+ # 绘制std.eruptions的直方图(上图)
geom_label(aes(x=3,y=0.2),label="std.eruptions",color="red")+ # 添加标签
geom_density(aes(x=std.waiting,y=-..density..),bins=30,color="grey50",fill="blue",alpha=0.3)+ # 绘制std.waiting的直方图(下图)
geom_label(aes(x=5,y=-0.1),label="std.waiting",color="blue")+ # 添加标签
xlab("指标值")+ggtitle("(d) 标准化数据镜像直方图")
Warning in geom_density(aes(x = std.eruptions, y = ..density..), bins = 30, :
Ignoring unknown parameters: `bins`
Warning in geom_density(aes(x = std.waiting, y = -..density..), bins = 30, :
Ignoring unknown parameters: `bins`
::grid.arrange(p1,p2,ncol=2) # 组合图形 gridExtra
Warning in geom_label(aes(x = 30, y = 0.2), label = "eruptions", color = "red"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
Warning in geom_label(aes(x = 60, y = -0.1), label = "waiting", color = "blue"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
Warning in geom_label(aes(x = 3, y = 0.2), label = "std.eruptions", color = "red"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
Warning in geom_label(aes(x = 5, y = -0.1), label = "std.waiting", color = "blue"): All aesthetics have length 1, but the data has 272 rows.
ℹ Please consider using `annotate()` or provide this layer with data containing
a single row.
图形观察和代码编写的心得体会
叠加直方图:图(a)呈现原始数据下 “eruptions” 和 “waiting” 的分布,能看出两者分布差异显著,“eruptions” 集中在左侧,“waiting” 在右侧。图(b)是标准化后数据的叠加直方图,消除量纲影响,更便于对比分布形态,分布特征在标准化后有新呈现。
核密度图:图中核密度图展示变量分布的平滑曲线。图(c)将 “eruptions” 和 “waiting” 以镜像方式呈现,直观展现两者分布范围和密度差异。图(d)是标准化后的镜像核密度图,进一步消除原始量纲影响,能清晰观察两者分布特征和相对关系,如分布的对称性、峰值位置等。
箱线图和小提琴图
绘图要求
根据实际数据和标准化后的数据绘制
eruptions
和waiting
两个变量的箱线图geom_boxplot
和小提琴图geom_violin
。采用
stat_summary(fun="mean",geom="point")
在箱线图和均值图中要添加均值点。小提琴图中要加入点图和箱线图
采用调色板前两种颜色,
brewer.pal(6,"Set2")[1:2]
,作为箱体填充颜色。
"#66C2A5" "#FC8D62" "#8DA0CB" "#E78AC3" "#A6D854" "#FFD92F"
箱线图代码
<- data|> select(eruptions,waiting) |>
df gather(eruptions,waiting,key=指标,value=指标值)%>%# 融合数据
ddply("指标",transform,标准化值=scale(指标值))
<-RColorBrewer::brewer.pal(6,"Set2")[1:2] # 设置离散型调色板
palette<-ggplot(df,aes(x=指标,y=指标值))+
p1geom_boxplot(fill=palette)+ # 绘制箱线图并设置填充颜色
stat_summary(fun="mean",geom="point",shape=21,size=2.5,fill="white")
<-ggplot(df,aes(x=指标,y=标准化值))+
p2geom_boxplot(fill=palette)+ # 绘制箱线图并设置填充颜色
stat_summary(fun="mean",geom="point",shape=21,size=2.5,fill="white")
::grid.arrange(p1,p2,ncol=2) gridExtra
小提琴图代码
- 通过
d3r::d3_nest
将数据框转化为层次数据“d3.js”作为绘图输入
<- data|> select(eruptions,waiting) |>
df gather(eruptions,waiting,key=指标,value=指标值)%>%# 融合数据
ddply("指标",transform,标准化值=scale(指标值))
# 绘制箱线图和小提琴图
# 图(a)原始数据小提琴图
<-ggplot(df,aes(x=指标,y=指标值,fill=指标))+
p1geom_violin(scale="width",trim=FALSE)+
geom_point(color="black",size=0.8)+ # 添加点
geom_boxplot(outlier.size=0.7,outlier.color="white",size=0.3,
width=0.2,fill="white")+ # 添加并设置箱线图和离群点参数
scale_fill_brewer(palette="Set2")+
stat_summary(fun=mean,geom="point",shape=21,size=2)+# 添加均值点
guides(fill="none")+
ggtitle("(a) 原始数据小提琴图")
# 图(b)数据标准化后的小提琴图
<-ggplot(df,aes(x=指标,y=标准化值,fill=指标))+
p2geom_violin(scale="width")+
#geom_point(color="black",size=1)+
geom_boxplot(,outlier.size=0.7,outlier.color="black",size=0.3,
width=0.2,fill="white")+
scale_fill_brewer(palette="Set2")+
guides(fill="none")+
ggtitle("(b) 标准化小提琴图")
::grid.arrange(p1,p2,ncol=2) gridExtra
图形观察和代码编写的心得体会
箱线图:左侧原始数据箱线图中,“eruptions” 指标值分布范围小,数据集中在较低值区域;“waiting” 指标值分布范围大,中位数较高。右侧标准化箱线图消除量纲影响,可直观看出两指标标准化值的分布差异。
小提琴图:原始数据小提琴图中,“eruptions” 数据分布集中在小范围,“waiting” 分布更分散且集中在较高值。标准化小提琴图中,分布形态差异依然明显,同时标准化处理让两者分布对比更直观,可清晰看到分布的对称性、峰值位置及数据离散程度等特征。
威尔金森点图、蜂群图和云雨图
绘图要求
绘制
eruptions
和waiting
两个变量的威尔金森点图、蜂群图和云雨图。三种图形均采用标准化数据作图
威尔金森点图采用
geom_dotplot(binaxis="y",bins=30,dotsize = 0.3)
,要求作出居中堆叠和向上堆叠两种情况的图。蜂群图采用
geom_beeswarm(cex=0.8,shape=21,size=0.8)
,要求作出不带箱线图和带有箱线图两种情况的图。云雨图采用
geom_violindot(dots_size=0.7,binwidth=0.07)
,要求作出横向和纵向图两种情况的图。
威尔金森点图代码
分别作矩形热图和极坐标热图
<-theme_bw()+theme(legend.position="none")
mytheme
<- data|>
df gather(eruptions,waiting,key=指标,value=指标值)%>%# 融合数据
ddply("指标",transform,标准化值=scale(指标值))
<-ggplot(df,aes(x=指标,y=标准化值,fill=指标))
p<-p+geom_dotplot(binaxis="y",bins=30,dotsize = 0.3,stackdir="center")+ # 绘制点图
p1+ggtitle("(a) 居中堆叠") mytheme
Warning in geom_dotplot(binaxis = "y", bins = 30, dotsize = 0.3, stackdir =
"center"): Ignoring unknown parameters: `bins`
<-p+geom_dotplot(binaxis="y",bins=30,dotsize = 0.3)+ # 绘制点图
p2+ggtitle("(b) 向上堆叠") mytheme
Warning in geom_dotplot(binaxis = "y", bins = 30, dotsize = 0.3): Ignoring
unknown parameters: `bins`
::grid.arrange(p1,p2,ncol=2) gridExtra
Bin width defaults to 1/30 of the range of the data. Pick better value with
`binwidth`.
Bin width defaults to 1/30 of the range of the data. Pick better value with
`binwidth`.
蜂群图代码
library(ggbeeswarm)
<- data|>
df gather(eruptions,waiting,key=指标,value=指标值)%>%# 融合数据
ddply("指标",transform,标准化值=scale(指标值))
# 图(a)5项指标的蜂群图
<-theme_bw()+theme(legend.position="none")
mytheme<-ggplot(df,aes(x=指标,y=标准化值))
p<-p+geom_beeswarm(cex=0.8,shape=21,fill="black",size=0.7,aes(color=指标))+# 设置蜂群的宽度、点的形状、大小和填充颜色
p1+ggtitle("(c) 蜂群图")
mytheme
# 图(b)箱线图+蜂群图
<-p+geom_boxplot(size=0.5,outlier.size=0.8,aes(color=指标))+
p2geom_beeswarm(shape=21,cex=0.8,size=0.8,aes(color=指标))+
+ggtitle("(d) 箱线图+蜂群图")
mytheme
::grid.arrange(p1,p2,ncol=2) gridExtra
云雨图代码
library(see) # 提供主题函数theme_modern
Warning: package 'see' was built under R version 4.3.3
Attaching package: 'see'
The following object is masked from 'package:ggiraphExtra':
coord_radar
<- data|>
df gather(eruptions,waiting,key=指标,value=指标值)%>%# 融合数据
ddply("指标",transform,标准化值=scale(指标值))
<-theme_modern()+
mythemetheme(legend.position="none",
plot.title=element_text(size=14,hjust=0.5)) # 调整标题位置
<-ggplot(df,aes(x=指标,y=标准化值,fill=指标))+
p1geom_violindot(dots_size=0.7,binwidth=0.07)+ # 绘制云雨图并设置点的大小和箱宽
+ggtitle("(e) 垂直排列(默认)")
mytheme
<-ggplot(df,aes(x=指标,y=标准化值,fill=指标))+
p2geom_violindot(dots_size=0.7,binwidth=0.07)+
coord_flip()+mytheme+ggtitle("(f) 水平排列")
::grid.arrange(p1,p2,ncol=2) gridExtra
图形观察和代码编写的心得体会
图(a)居中堆叠与图(b)向上堆叠,通过点的分布展示数据离散情况,可直观对比两指标标准化值的分布范围与集中趋势。
蜂群图:图(c)蜂群图将数据点有序排列,更清晰展现数据分布形态;图(d)结合箱线图与蜂群图,既呈现数据分布特征(如中位数、四分位数等),又展示具体数据点分布。
小提琴图变体:图(e)垂直排列(默认)和图(f)水平排列,在小提琴图基础上加入数据点,不仅展示分布密度,还能看到具体数据点位置,帮助理解数据分布的同时,体现数据离散程度。垂直排列便于上下对比,水平排列则利于横向观察分布区间。