Skip to content

Commit 42cc72d

Browse files
export binned_scale (#3912)
1 parent 5aca1be commit 42cc72d

File tree

2 files changed

+2
-0
lines changed

2 files changed

+2
-0
lines changed

NAMESPACE

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -274,6 +274,7 @@ export(as_labeller)
274274
export(autolayer)
275275
export(autoplot)
276276
export(benchplot)
277+
export(binned_scale)
277278
export(borders)
278279
export(calc_element)
279280
export(combine_vars)

R/scale-.r

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -205,6 +205,7 @@ discrete_scale <- function(aesthetics, scale_name, palette, name = waiver(),
205205

206206
#' Binning scale constructor
207207
#'
208+
#' @export
208209
#' @inheritParams continuous_scale
209210
#' @param n.breaks The number of break points to create if breaks are not given
210211
#' directly.

0 commit comments

Comments
 (0)