我想使用ggplo2
来分析Likert比例变量。我想得到这种图形(下图),但我不知道如何在堆叠条上添加标签,并为每个分组变量和facet变量插入不同的计数和均值(对于facet_wrap
)。
我将不胜感激任何帮助!
可以从here
获取数据我的代码:
library(ggplot2)
library(scales)
library(RColorBrewer)
ggplot(example,aes(GroupungVar,fill=VarOfInterest)) + geom_bar(position='fill') +
scale_fill_manual(values = (brewer.pal(5, "Greens"))) +
facet_wrap(~FacetVar,ncol=1) + coord_flip() +
scale_y_continuous(labels=percent) + ylab('Percent')
我得到了什么......
..以及我想要实现的目标(数字与数据集中的数字不同)。我希望每组标签中有计数(N),条形上的百分比标签和右侧的平均值(当然每组)。百分比和平均值应该适用于图中的所有条形,我只将它们添加到前几个条中,只是为了表明我的意思。
答案 0 :(得分:7)
我和R和ggplot2共度夜晚,我得到了我想要的东西:)
library('ggplot2')
library('plyr')
library('RColorBrewer')
library(scales)
label_positions<- function(x) {
n<-length(x)
wynik<-numeric(n)
for (i in 1:n){
if (i==1) {
wynik[i]<-0+x[i]/2
}
else {
wynik[i]<-x[i]-(x[i]-x[i-1])/2
}
}
return(wynik)
}
exam1<-ddply(example,.(GroupingVar,FacetVar,VarOfInterest), 'nrow')
exam1.1<-ddply(example,.(GroupingVar,FacetVar),summarise, sr=mean(as.numeric(VarOfInterest),na.rm=T),
odch=sd(as.numeric(VarOfInterest,na.rm=T)))
exam1<-merge(exam1,exam1.1,by.x=c('GroupingVar','FacetVar'),by.y=c('GroupingVar','FacetVar'))
names(exam1)[4]<-'Count'
exam2<-mutate(exam1,cumul=ave(Count,list(GroupingVar,FacetVar),FUN=cumsum),
N=ave(cumul, list(GroupingVar,FacetVar),FUN=max),
CumSumPercent=cumul/N*100,
Freq=Count/N*100)
exam2<-mutate(exam2,cfrq = ave(CumSumPercent, list(GroupingVar,FacetVar), FUN = label_positions))
exam2$XLabel<-paste(exam2$GroupingVar,' (N=',exam2$N,')',sep='')
exam2$PosMean<-105
p<-ggplot(exam2, aes(x = Etykieta, y = Freq, fill = VarOfInterest)) +
geom_bar(stat = 'identity',colour="black") +
labs (x = "", y = "Percentage", fill=" ") +
scale_fill_brewer(name="Rating", palette="Greens", breaks = rev(levels(exam2$VarOfInterest))) +
geom_text(aes(y = cfrq, label=paste(sprintf("%.01f",Freq), "%", sep='')), size=5) +
geom_text(aes(y=PosMean,label=paste(sprintf("%.02f",sr),' (',sprintf("%.02f",odch),')',sep='')),size=5)+
facet_wrap(~FacetVar,ncol=1) +
coord_flip() + ylab('Procent odpowiedzi') +
guides(fill=guide_legend(title=NULL)) + theme_bw() +
theme(legend.position="bottom",strip.text.x=element_text(size=15,face='bold'),
axis.text.x =element_text(size=12,face='bold'), axis.text.y =element_text(size=12,face='bold'),
axis.title.x=element_text(size=15,face='bold'), axis.title.y=element_text(size=15,face='bold'),
strip.background=element_rect(colour='black'))
plot(p)
结果
答案 1 :(得分:4)
对于样本大小,我可能只是将它们放在轴标签中,而不是放在图形本身上:
library(plyr)
example <- ddply(example,.(FacetVar,GroupungVar),
transform,
GroupingVar = paste(as.character(GroupungVar)," - (n=",length(GroupungVar),")",sep = ""))
ggplot(example,aes(GroupingVar,fill=VarOfInterest)) +
geom_bar(position='fill') +
scale_fill_manual(values = (brewer.pal(5, "Greens"))) +
facet_wrap(~FacetVar,ncol=1) +
coord_flip() +
scale_y_continuous(labels=percent) +
ylab('Percent')