forked from tidyverse/ggplot2
-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathcoord-polar.r
48 lines (33 loc) · 1.82 KB
/
coord-polar.r
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
vcontext("coord-polar")
dat <- data.frame(x = 0:1, y=rep(1:80, each=2))
ggplot(dat, aes(x=x, y=y, group=factor(y))) + geom_line() + coord_polar()
save_vtest("Concentric circles at theta = 1:80")
ggplot(dat, aes(x=x, y=y-80, group=factor(y))) + geom_line() + coord_polar()
save_vtest("Concentric circles at theta = 1:80 - 80")
ggplot(dat, aes(x=x, y=y-40, group=factor(y))) + geom_line() + coord_polar()
save_vtest("Concentric circles at theta = 1:80 - 40")
ggplot(dat, aes(x=x, y=y+100, group=factor(y))) + geom_line() + coord_polar()
save_vtest("Concentric circles at theta = 1:80 + 100")
ggplot(dat, aes(x=x, y=y*100, group=factor(y))) + geom_line() + coord_polar()
save_vtest("Concentric circles at theta = 1:80 * 100")
dat <- data.frame(
theta = c(0, 2*pi, 2, 6, 6, 1, 1, 0),
r = c(0, 0, 0.5, 0.5, 1, 1, 0.75, .5),
g = 1:8)
ggplot(dat, aes(x=theta, y=r, colour = g)) + geom_path() +
geom_point(alpha=0.3, colour="black") + coord_polar()
save_vtest("Rays, circular arcs, and spiral arcs")
dat <- data.frame(x=LETTERS[1:6], y=11:16)
ggplot(dat, aes(x=x, y=y)) + geom_bar(stat="identity") + coord_polar()
save_vtest("rose plot with has equal spacing")
ggplot(dat, aes(x=as.numeric(x), y=y)) + geom_point() + coord_polar()
save_vtest("continuous theta has merged low/high values")
ggplot(dat, aes(x=as.numeric(x), y=y)) + geom_point() + coord_polar() +
xlim(0, 6) + ylim(0,16)
save_vtest("continuous theta with xlim(0, 6) and ylim(0, 16)")
ggplot(dat, aes(x=x, y=y)) + geom_bar(stat="identity") + coord_polar(theta = "y")
save_vtest("racetrack plot with expand=F is closed and doesn't have center hole")
ggplot(dat, aes(x=x, y=y)) + geom_bar(stat="identity") + coord_polar(theta = "y") +
scale_x_discrete(expand = c(0, 0.6))
save_vtest("racetrack plot with expand=T is closed and has center hole")
end_vcontext()