Skip to content

Commit e2d704e

Browse files
Add rename_size=TRUE to GeomSf, GeomCrossbar, GeomPointrange, and GeomSmooth (#4884)
1 parent 61ccdeb commit e2d704e

File tree

4 files changed

+12
-4
lines changed

4 files changed

+12
-4
lines changed

R/geom-crossbar.r

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -107,5 +107,7 @@ GeomCrossbar <- ggproto("GeomCrossbar", Geom,
107107
GeomPolygon$draw_panel(box, panel_params, coord, lineend = lineend, linejoin = linejoin),
108108
GeomSegment$draw_panel(middle, panel_params, coord, lineend = lineend, linejoin = linejoin)
109109
)))
110-
}
110+
},
111+
112+
rename_size = TRUE
111113
)

R/geom-pointrange.r

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -57,5 +57,7 @@ GeomPointrange <- ggproto("GeomPointrange", Geom,
5757
GeomPoint$draw_panel(transform(data, size = size * fatten), panel_params, coord)
5858
))
5959
)
60-
}
60+
},
61+
62+
rename_size = TRUE
6163
)

R/geom-sf.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -149,7 +149,9 @@ GeomSf <- ggproto("GeomSf", Geom,
149149
} else {
150150
draw_key_polygon(data, params, size)
151151
}
152-
}
152+
},
153+
154+
rename_size = TRUE
153155
)
154156

155157
default_aesthetics <- function(type) {

R/geom-smooth.r

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -160,5 +160,7 @@ GeomSmooth <- ggproto("GeomSmooth", Geom,
160160
optional_aes = c("ymin", "ymax"),
161161

162162
default_aes = aes(colour = "#3366FF", fill = "grey60", linewidth = 1,
163-
linetype = 1, weight = 1, alpha = 0.4)
163+
linetype = 1, weight = 1, alpha = 0.4),
164+
165+
rename_size = TRUE
164166
)

0 commit comments

Comments
 (0)