You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
* The appearance of line joins is controlled by `linejoin` and can be one of
@@ -121,23 +121,23 @@ The `size` of a line is its width in mm.
121
121
df <- data.frame(x = 1:3, y = c(9, 1, 9))
122
122
base <- ggplot(df, aes(x, y)) + ylim(0, 10)
123
123
base +
124
-
geom_path(size = 10) +
125
-
geom_path(size = 1, colour = "red")
124
+
geom_path(linewidth = 10) +
125
+
geom_path(linewidth = 1, colour = "red")
126
126
127
127
base +
128
-
geom_path(size = 10, linejoin = "mitre") +
129
-
geom_path(size = 1, colour = "red")
128
+
geom_path(linewidth = 10, linejoin = "mitre") +
129
+
geom_path(linewidth = 1, colour = "red")
130
130
131
131
base +
132
-
geom_path(size = 10, linejoin = "bevel") +
133
-
geom_path(size = 1, colour = "red")
132
+
geom_path(linewidth = 10, linejoin = "bevel") +
133
+
geom_path(linewidth = 1, colour = "red")
134
134
```
135
135
136
136
Mitre joins are automatically converted to bevel joins whenever the angle is too small (which would create a very long bevel). This is controlled by the `linemitre` parameter which specifies the maximum ratio between the line width and the length of the mitre.
137
137
138
138
## Polygons
139
139
140
-
The border of the polygon is controlled by the `colour`, `linetype`, and `size` aesthetics as described above. The inside is controlled by `fill`.
140
+
The border of the polygon is controlled by the `colour`, `linetype`, and `linewidth` aesthetics as described above. The inside is controlled by `fill`.
141
141
142
142
## Point
143
143
@@ -199,7 +199,7 @@ Note that shapes 21-24 have both stroke `colour` and a `fill`. The size of the f
0 commit comments