Skip to content

Commit e9d98c1

Browse files
committed
prefix scales pkg
1 parent fb28e25 commit e9d98c1

File tree

1 file changed

+3
-3
lines changed

1 file changed

+3
-3
lines changed

R/scale-colour.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -197,13 +197,13 @@ scale_fill_binned <- function(..., palette = NULL, aesthetics = "fill", guide =
197197
#' geom_point()
198198
#'
199199
#' # You can use the scale to give a palette directly
200-
#' p + scale_colour_discrete(palette = pal_brewer(palette = "Dark2"))
200+
#' p + scale_colour_discrete(palette = scales::pal_brewer(palette = "Dark2"))
201201
#'
202202
#' # The default colours are encoded into the theme
203-
#' p + theme(palette.colour.discrete = pal_grey())
203+
#' p + theme(palette.colour.discrete = scales::pal_grey())
204204
#'
205205
#' # You can globally set default colour palette via the theme
206-
#' old <- update_theme(palette.colour.discrete = pal_viridis())
206+
#' old <- update_theme(palette.colour.discrete = scales::pal_viridis())
207207
#'
208208
#' # Plot now shows new global default
209209
#' p

0 commit comments

Comments
 (0)