> --
> You received this message because you are subscribed to the ggplot2 mailing list.
> Please provide a reproducible example: http://gist.github.com/270442
>
> To post: email ggp...@googlegroups.com
> To unsubscribe: email ggplot2+u...@googlegroups.com
> More options: http://groups.google.com/group/ggplot2
library(ggplot2)
ass<-structure(list(assort = c(0.1994, 0.3696, 0.4056, 0.3933, 0.4322,
p<-ggplot(ass, aes(factor(diag),assort))
p + geom_boxplot(aes(fill = factor(task)))
ggplot(ass, aes(factor(diag),assort)) +
geom_boxplot(aes(fill = factor(task)), position=position_dodge(width=0.9)) +
geom_text(aes(x,y,label=v), data.frame(x=factor(0:2),
y=rep(0.45,3),v=c("*","","*")))
--
Kohske Takahashi <takahash...@gmail.com>
Research Center for Advanced Science and Technology,
The University of Tokyo, Japan.
http://www.fennel.rcast.u-tokyo.ac.jp/profilee_ktakahashi.html