Skip to content

Commit bb64edd

Browse files
authored
dedocument type options (#6658)
1 parent f28d8c1 commit bb64edd

File tree

3 files changed

+8
-36
lines changed

3 files changed

+8
-36
lines changed

R/scale-colour.R

Lines changed: 4 additions & 16 deletions
Original file line numberDiff line numberDiff line change
@@ -28,10 +28,9 @@
2828
#' between 0 and 1 returns the corresponding output values.
2929
#' @inheritDotParams continuous_scale -scale_name -trans -minor_breaks -expand
3030
#' @inheritDotParams binned_scale -scale_name -trans -expand
31-
#' @param type `r lifecycle::badge("superseded")` One of the following:
32-
#' * "gradient" (the default)
33-
#' * "viridis"
34-
#' * A function that returns a continuous colour scale.
31+
#' @param type `r lifecycle::badge("superseded")` The preferred mechanism for
32+
#' setting the default palette is by using the theme. For example:
33+
#' `theme(palette.colour.discrete = "viridis")`.
3534
#' @seealso [continuous_scale()] and [binned_scale()]
3635
#'
3736
#' The documentation on [colour aesthetics][aes_colour_fill_alpha].
@@ -180,18 +179,7 @@ scale_fill_binned <- function(..., palette = NULL, aesthetics = "fill", guide =
180179
#' @inheritParams discrete_scale
181180
#' @param type `r lifecycle::badge("superseded")` The preferred mechanism for
182181
#' setting the default palette is by using the theme. For example:
183-
#' `theme(palette.colour.discrete = "Okabe-Ito")`. One of the following:
184-
#' * A character vector of color codes. The codes are used for a 'manual' color
185-
#' scale as long as the number of codes exceeds the number of data levels
186-
#' (if there are more levels than codes, [scale_colour_hue()]/[scale_fill_hue()]
187-
#' are used to construct the default scale). If this is a named vector, then the color values
188-
#' will be matched to levels based on the names of the vectors. Data values that
189-
#' don't match will be set as `na.value`.
190-
#' * A list of character vectors of color codes. The minimum length vector that exceeds the
191-
#' number of data levels is chosen for the color scaling. This is useful if you
192-
#' want to change the color palette based on the number of levels.
193-
#' * A function that returns a discrete colour/fill scale (e.g., [scale_fill_hue()],
194-
#' [scale_fill_brewer()], etc).
182+
#' `theme(palette.colour.discrete = "Okabe-Ito")`.
195183
#' @export
196184
#' @seealso [discrete_scale()]
197185
#' @family colour scales

man/scale_colour_continuous.Rd

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

man/scale_colour_discrete.Rd

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

0 commit comments

Comments
 (0)