Skip to content
Merged
1 change: 0 additions & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -150,7 +150,6 @@ Collate:
'geom-density2d.R'
'geom-dotplot.R'
'geom-errorbar.R'
'geom-errorbarh.R'
'geom-freqpoly.R'
'geom-function.R'
'geom-hex.R'
Expand Down
44 changes: 44 additions & 0 deletions R/geom-errorbar.R
Original file line number Diff line number Diff line change
Expand Up @@ -23,6 +23,35 @@ geom_errorbar <- function(mapping = NULL, data = NULL,
)
}

#' @export
#' @rdname geom_linerange
#' @note
#' `geom_errorbarh()` is `r lifecycle::badge("deprecated")`. Use
#' `geom_errorbar(orientation = "y")` instead.
geom_errorbarh <- function(mapping = NULL, data = NULL,
stat = "identity", position = "identity",
...,
orientation = "y",
na.rm = FALSE,
show.legend = NA,
inherit.aes = TRUE) {
deprecate_soft0(
"3.5.2", "geom_errobarh()", "geom_errorbar(orientation = \"y\")",
id = "no-more-errorbarh"
)
geom_errorbar(
mapping = mapping,
data = data,
stat = stat,
position = position,
...,
orientation = orientation,
na.rm = na.rm,
show.legend = show.legend,
inherit.aes = inherit.aes
)
}

#' @rdname ggplot2-ggproto
#' @format NULL
#' @usage NULL
Expand Down Expand Up @@ -80,3 +109,18 @@ GeomErrorbar <- ggproto("GeomErrorbar", Geom,

rename_size = TRUE
)

#' @rdname ggplot2-ggproto
#' @format NULL
#' @usage NULL
#' @export
GeomErrorbarh <- ggproto(
"GeomErrorbarh", GeomErrorbar,
setup_params = function(data, params) {
deprecate_soft0(
"3.5.2", "geom_errobarh()", "geom_errorbar(orientation = \"y\")",
id = "no-more-errorbarh"
)
GeomLinerange$setup_params(data, params)
}
)
91 changes: 0 additions & 91 deletions R/geom-errorbarh.R

This file was deleted.

3 changes: 1 addition & 2 deletions R/geom-linerange.R
Original file line number Diff line number Diff line change
Expand Up @@ -11,8 +11,7 @@
#' `geom_pointrange()`.
#' @seealso
#' [stat_summary()] for examples of these guys in use,
#' [geom_smooth()] for continuous analogue,
#' [geom_errorbarh()] for a horizontal error bar.
#' [geom_smooth()] for continuous analogue
#' @export
#' @inheritParams layer
#' @inheritParams geom_bar
Expand Down
147 changes: 0 additions & 147 deletions man/geom_errorbarh.Rd

This file was deleted.

20 changes: 18 additions & 2 deletions man/geom_linerange.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

Loading
Loading