I need some help with:
1. Changing colour=black for ticks marks on circle outline (currently
its white).
2. Removing numeric label "1" which is appearing on y-axis of
following pie chart.
# R Code
library(ggplot2)
pg <- ggplot(as.data.frame.table(VADeaths), aes(x = factor(1), y =
Freq, fill = Var1)) +
geom_bar(width = 1) +
facet_wrap(~Var2, scales = "free_y") +
coord_polar(theta = "y") +
opts(panel.grid.major = theme_blank())
print(pg)
Thanks in advance,
Kim
--
You received this message because you are subscribed to the ggplot2 mailing list.
To post to this group, send email to ggp...@googlegroups.com
To unsubscribe from this group, send email to
ggplot2+u...@googlegroups.com
For more options, visit this group at
http://groups.google.com/group/ggplot2
last_plot() + opts(panel.grid.minor = theme_line(colour = "black")
But Dennis is right, it interferes with the labels.
Charlotte
> ggplot2+unsubscribegooglegroups.com or reply to this email with the words
> "REMOVE ME" as the subject.
>