Skip to content

Commit f4cff4f

Browse files
authored
ignore min/max variables when detecting orientation in geom_bar (#3882)
1 parent 6c8c8ce commit f4cff4f

File tree

3 files changed

+3
-7
lines changed

3 files changed

+3
-7
lines changed

R/geom-bar.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -119,7 +119,7 @@ GeomBar <- ggproto("GeomBar", GeomRect,
119119
non_missing_aes = c("xmin", "xmax", "ymin", "ymax"),
120120

121121
setup_params = function(data, params) {
122-
params$flipped_aes <- has_flipped_aes(data, params, range_is_orthogonal = FALSE)
122+
params$flipped_aes <- has_flipped_aes(data, params)
123123
params
124124
},
125125

R/utilities.r

Lines changed: 1 addition & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -461,9 +461,7 @@ switch_orientation <- function(aesthetics) {
461461
#' - `range_is_orthogonal`: This argument controls whether the existance of
462462
#' range-like aesthetics (e.g. `xmin` and `xmax`) represents the main or
463463
#' secondary axis. If `TRUE` then the range is given for the secondary axis as
464-
#' seen in e.g. [geom_ribbon()] and [geom_linerange()]. `FALSE` is less
465-
#' prevalent but can be seen in [geom_bar()] where it may encode the span of
466-
#' each bar.
464+
#' seen in e.g. [geom_ribbon()] and [geom_linerange()].
467465
#' - `group_has_equal`: This argument controls whether to test for equality of
468466
#' all `x` and `y` values inside each group and set the main axis to the one
469467
#' where all is equal. This test is only performed if `TRUE`, and only after

man/bidirection.Rd

Lines changed: 1 addition & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)