Skip to content

Commit

Permalink
don't warn when fatten is absent (tidyverse#6310)
Browse files Browse the repository at this point in the history
  • Loading branch information
teunbrand authored Feb 27, 2025
1 parent d1fb550 commit e727e2b
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/geom-crossbar.R
Original file line number Diff line number Diff line change
Expand Up @@ -60,7 +60,7 @@ geom_crossbar <- function(mapping = NULL, data = NULL,
#' @export
GeomCrossbar <- ggproto("GeomCrossbar", Geom,
setup_params = function(data, params) {
if (lifecycle::is_present(params$fatten)) {
if (lifecycle::is_present(params$fatten %||% deprecated())) {
deprecate_soft0(
"3.6.0", "geom_crossbar(fatten)",
"geom_crossbar(middle.linewidth)"
Expand Down
2 changes: 1 addition & 1 deletion R/geom-pointrange.R
Original file line number Diff line number Diff line change
Expand Up @@ -42,7 +42,7 @@ GeomPointrange <- ggproto("GeomPointrange", Geom,
required_aes = c("x", "y", "ymin|xmin", "ymax|xmax"),

setup_params = function(data, params) {
if (lifecycle::is_present(params$fatten)) {
if (lifecycle::is_present(params$fatten %||% deprecated())) {
deprecate_soft0("3.6.0", "geom_pointrange(fatten)", I("the `size` aesthetic"))
} else {
# For backward compatibility reasons
Expand Down

0 comments on commit e727e2b

Please sign in to comment.