Skip to content

Commit 034eb62

Browse files
committed
update RD
1 parent 75af49c commit 034eb62

23 files changed

+24
-40
lines changed

R/scale_color_flat.R

+3-17
Original file line numberDiff line numberDiff line change
@@ -45,7 +45,6 @@ scale_color_flat <- function(palette = "contrast",
4545
}
4646

4747

48-
4948
# Aliases -----------------------------------------------------------------
5049

5150

@@ -94,13 +93,9 @@ scale_colour_flat_c <- scale_color_flat_c
9493
scale_colour_flat_d <- scale_color_flat_d
9594

9695

97-
98-
99-
10096
# Fill --------------------------------------------------------------------
10197

10298

103-
10499
#' @rdname scale_color_flat
105100
#' @export
106101
scale_fill_flat <- function(palette = "contrast",
@@ -134,6 +129,7 @@ scale_fill_flat_d <- function(palette = "contrast",
134129
)
135130
}
136131

132+
137133
#' @rdname scale_color_flat
138134
#' @export
139135
scale_fill_flat_c <- function(palette = "contrast",
@@ -151,14 +147,9 @@ scale_fill_flat_c <- function(palette = "contrast",
151147
}
152148

153149

154-
155-
156-
157150
# Palette --------------------------------------------------------------------
158151

159152

160-
161-
162153
# The palette based on flat design colors: https://www.materialui.co/flatuicolors
163154
flat_colors_list <- c(
164155
`red` = "#e74c3c",
@@ -205,8 +196,6 @@ flat_colors <- function(...) {
205196
}
206197

207198

208-
209-
210199
flat_palettes <- list(
211200
`full` = flat_colors(),
212201
`ice` = flat_colors("purple", "deep purple", "blue", "light blue"),
@@ -239,9 +228,6 @@ flat_palettes <- list(
239228

240229

241230

242-
243-
244-
245231
#' Flat UI color palette
246232
#'
247233
#' The palette based on [Flat UI](https://materialui.co/flatuicolors).
@@ -251,10 +237,10 @@ flat_palettes <- list(
251237
#' `"contrast"`, `"light"` (for dark themes), `"black_first"`, `full_original`,
252238
#' or `black_first_original`.
253239
#' @param reverse Boolean indicating whether the palette should be reversed.
254-
#' @param ... Additional arguments to pass to [`colorRampPalette()`][colorRampPalette].
240+
#' @param ... Additional arguments to pass to [`grDevices::colorRampPalette()`].
255241
#'
256242
#' @details This function is usually not called directly, but from within
257-
#' [`scale_color_flat()`][scale_color_flat].
243+
#' [`scale_color_flat()`].
258244
#'
259245
#' @export
260246
palette_flat <- function(palette = "contrast", reverse = FALSE, ...) {

R/scale_color_pizza.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -194,7 +194,7 @@ pizza_palettes <- list(
194194
#' @param palette Pizza type. Can be "margherita" (default), "margherita_crust",
195195
#' "diavola" or "diavola_crust".
196196
#' @param reverse Boolean indicating whether the palette should be reversed.
197-
#' @param ... Additional arguments to pass to [`colorRampPalette()`][colorRampPalette].
197+
#' @param ... Additional arguments to pass to [`grDevices::colorRampPalette()`].
198198
#'
199199
#' @details This function is usually not called directly, but from within
200200
#' [`scale_color_pizza()`][scale_color_pizza].

R/scale_color_see.R

-2
Original file line numberDiff line numberDiff line change
@@ -240,8 +240,6 @@ palette_see <- function(palette = "contrast", reverse = FALSE, ...) {
240240

241241

242242

243-
244-
245243
# helper -----------------------
246244

247245
.retrieve_palette <- function(palette, palette_list, reverse = FALSE, ...) {

R/scale_color_tol.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -189,7 +189,7 @@ tol_colors <- function(..., palette = "bright") {
189189
#' @param order A vector of numbers indicating the order of colors to use
190190
#' (default: `NULL` indicating to use all available colors in order).
191191
#' @param ... For sequential palettes other than `rainbow_discrete`, additional
192-
#' arguments to pass to [`colorRampPalette()`][colorRampPalette].
192+
#' arguments to pass to [`grDevices::colorRampPalette()`].
193193
#'
194194
#' @references
195195
#' Tol, P. (2021). Colour schemes (SRON/EPS Technical Note No. 09-002; Version 3.2).

man/palette_bluebrown.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_colorhex.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_flat.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_material.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_metro.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_okabeito.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_pizza.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_see.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_social.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/palette_tol_discrete.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_bluebrown.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_colorhex.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_material.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_metro.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_okabeito.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_pizza.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_see.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_social.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_color_tol_discrete.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)