Your geom_text layer is using the default data.set, therefore it
superimposes many times the same label.
Try this instead,
library(ggplot2)
p <- ggplot(mtcars, aes(factor(cyl), mpg))
p + geom_boxplot() +
geom_text(data=data.frame(x=1,y=min(mtcars[["mpg"]])),aes(x=x,y=y,label="TEST"))
## or more concisely
library(ggplot2)
p <- ggplot(mtcars, aes(factor(cyl), mpg))
p + geom_boxplot() + annotate("text",x=1,y=min(mtcars[["mpg"]]),label="TEST")
HTH,
baptiste
> --
> 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
>
Thanks, Joh