data %>%summarise(across(everything(), mean, na.rm =TRUE)) %>%pivot_longer(cols =everything(), names_to ="Consumption_Type", values_to ="Average") %>%mutate(Consumption_Type=factor(Consumption_Type,level=c('食品','衣着','设备','医疗','交通','教育','居住','杂项')), ) %>%ggplot(aes(x = Consumption_Type, y = Average, fill = Consumption_Type)) +geom_bar(stat ="identity", position =position_dodge(), colour ="black") +theme_minimal() +labs(title ="各消费项目均值条形图", x ="类别", y ="均值",fill ="消费种类")
Warning: There was 1 warning in `summarise()`.
ℹ In argument: `across(everything(), mean, na.rm = TRUE)`.
Caused by warning:
! The `...` argument of `across()` is deprecated as of dplyr 1.1.0.
Supply arguments directly to `.fns` through an anonymous function instead.
# Previously
across(a:b, mean, na.rm = TRUE)
# Now
across(a:b, \(x) mean(x, na.rm = TRUE))
使各条形的颜色相同
data %>%summarise(across(everything(), mean, na.rm =TRUE)) %>%pivot_longer(cols =everything(), names_to ="Consumption_Type", values_to ="Average") %>%mutate(Consumption_Type=factor(Consumption_Type,level=c('食品','衣着','设备','医疗','交通','教育','居住','杂项')), ) %>%ggplot(aes(x = Consumption_Type, y = Average)) +geom_bar(stat ="identity", position =position_dodge(), colour ="yellow", fill ="pink") +theme_minimal() +labs(title ="各消费项目均值条形图", x ="类别", y ="均值")
各消费项目箱线图
boxplot函数直接作箱线图,默认每个变量(列)作一个箱线,并将全部变量的箱线在同一个图中展示。
boxplot(data)#按列做箱线图
boxplot(data,horizontal=T,las=1)#箱线图中图形按水平放置
利用ggplot函数作箱线图,需要对数据转化为长结果数据
data %>%pivot_longer(cols =1:8, names_to ="Consumption_Type", values_to ="Value") %>%mutate(Consumption_Type=factor(Consumption_Type,level=c('食品','衣着','设备','医疗','交通','教育','居住','杂项')), ) %>%ggplot(aes(x = Consumption_Type, y = Value)) +geom_boxplot() +labs(title ="各消费项目箱线图", x ="", y ="消费水平") +theme_minimal() # + coord_flip()
effect of variables:
modified item Var
"height of face " "食品"
"width of face " "衣着"
"structure of face" "设备"
"height of mouth " "医疗"
"width of mouth " "交通"
"smiling " "教育"
"height of eyes " "居住"
"width of eyes " "杂项"
"height of hair " "食品"
"width of hair " "衣着"
"style of hair " "设备"
"height of nose " "医疗"
"width of nose " "交通"
"width of ear " "教育"
"height of ear " "居住"
effect of variables:
modified item Var
"height of face " "食品"
"width of face " "设备"
"structure of face" "医疗"
"height of mouth " "交通"
"width of mouth " "教育"
"smiling " "食品"
"height of eyes " "设备"
"width of eyes " "医疗"
"height of hair " "交通"
"width of hair " "教育"
"style of hair " "食品"
"height of nose " "设备"
"width of nose " "医疗"
"width of ear " "交通"
"height of ear " "教育"
effect of variables:
modified item Var
"height of face " "食品"
"width of face " "衣着"
"structure of face" "设备"
"height of mouth " "医疗"
"width of mouth " "交通"
"smiling " "教育"
"height of eyes " "居住"
"width of eyes " "杂项"
"height of hair " "食品"
"width of hair " "衣着"
"style of hair " "设备"
"height of nose " "医疗"
"width of nose " "交通"
"width of ear " "教育"
"height of ear " "居住"