Skip to content

Commit e727e2b

Browse files
authored
don't warn when fatten is absent (#6310)
1 parent d1fb550 commit e727e2b

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/geom-crossbar.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -60,7 +60,7 @@ geom_crossbar <- function(mapping = NULL, data = NULL,
6060
#' @export
6161
GeomCrossbar <- ggproto("GeomCrossbar", Geom,
6262
setup_params = function(data, params) {
63-
if (lifecycle::is_present(params$fatten)) {
63+
if (lifecycle::is_present(params$fatten %||% deprecated())) {
6464
deprecate_soft0(
6565
"3.6.0", "geom_crossbar(fatten)",
6666
"geom_crossbar(middle.linewidth)"

R/geom-pointrange.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -42,7 +42,7 @@ GeomPointrange <- ggproto("GeomPointrange", Geom,
4242
required_aes = c("x", "y", "ymin|xmin", "ymax|xmax"),
4343

4444
setup_params = function(data, params) {
45-
if (lifecycle::is_present(params$fatten)) {
45+
if (lifecycle::is_present(params$fatten %||% deprecated())) {
4646
deprecate_soft0("3.6.0", "geom_pointrange(fatten)", I("the `size` aesthetic"))
4747
} else {
4848
# For backward compatibility reasons

0 commit comments

Comments
 (0)