Home
last modified time | relevance | path

Searched refs:aesthetics (Results 1 – 25 of 560) sorted by relevance

12345678910>>...23

/dports/graphics/R-cran-ggplot2/ggplot2/R/
H A Dscale-brewer.r79 scale_colour_brewer <- function(..., type = "seq", palette = 1, direction = 1, aesthetics = "colour… argument
80 discrete_scale(aesthetics, "brewer", brewer_pal(type, palette, direction), ...)
85 scale_fill_brewer <- function(..., type = "seq", palette = 1, direction = 1, aesthetics = "fill") { argument
86 discrete_scale(aesthetics, "brewer", brewer_pal(type, palette, direction), ...)
97 continuous_scale(aesthetics, "distiller",
105 … -1, values = NULL, space = "Lab", na.value = "grey50", guide = "colourbar", aesthetics = "fill") { argument
110 continuous_scale(aesthetics, "distiller",
116 …, palette = 1, direction = -1, na.value = "grey50", guide = "coloursteps", aesthetics = "colour") { argument
122 …binned_scale(aesthetics, "fermenter", binned_pal(brewer_pal(type, palette, direction)), na.value =…
127 …q", palette = 1, direction = -1, na.value = "grey50", guide = "coloursteps", aesthetics = "fill") { argument
[all …]
H A Dscale-steps.R46 binned_scale(aesthetics, "steps", seq_gradient_pal(low, high, space),
53 aesthetics = "colour") { argument
54 binned_scale(aesthetics, "steps2", div_gradient_pal(low, mid, high, space),
60 guide = "coloursteps", aesthetics = "colour", colors) { argument
62 binned_scale(aesthetics, "stepsn",
68 na.value = "grey50", guide = "coloursteps", aesthetics = "fill") { argument
69 binned_scale(aesthetics, "steps", seq_gradient_pal(low, high, space),
76 aesthetics = "fill") { argument
77 binned_scale(aesthetics, "steps2", div_gradient_pal(low, mid, high, space),
83 guide = "coloursteps", aesthetics = "fill", colors) { argument
[all …]
H A Dscale-viridis.r61 aesthetics,
71 direction = 1, option = "D", aesthetics = "fill") { argument
73 aesthetics,
85 guide = "colourbar", aesthetics = "colour") { argument
87 aesthetics,
105 guide = "colourbar", aesthetics = "fill") { argument
107 aesthetics,
125 guide = "coloursteps", aesthetics = "colour") { argument
127 aesthetics,
145 guide = "coloursteps", aesthetics = "fill") { argument
[all …]
H A Dscale-gradient.r77 continuous_scale(aesthetics, "gradient", seq_gradient_pal(low, high, space),
84 na.value = "grey50", guide = "colourbar", aesthetics = "fill") { argument
85 continuous_scale(aesthetics, "gradient", seq_gradient_pal(low, high, space),
96 aesthetics = "colour") { argument
97 continuous_scale(aesthetics, "gradient2",
106 aesthetics = "fill") { argument
107 continuous_scale(aesthetics, "gradient2",
123 guide = "colourbar", aesthetics = "colour", colors) { argument
126 continuous_scale(aesthetics, "gradientn",
132 guide = "colourbar", aesthetics = "fill", colors) { argument
[all …]
H A Dlayer.r127 c(geom$aesthetics(), stat$aesthetics())
226 aesthetics <- self$computed_mapping functionVar
230 calculated <- is_calculated_aes(aesthetics)
231 modifiers <- is_scaled_aes(aesthetics)
233 aesthetics <- aesthetics[!set & !calculated & !modifiers]
302 aesthetics <- self$computed_mapping functionVar
303 aesthetics <- defaults(aesthetics, self$stat$default_aes)
304 aesthetics <- compact(aesthetics)
306 new <- strip_dots(aesthetics[is_calculated_aes(aesthetics) | is_staged_aes(aesthetics)])
368 aesthetics <- self$computed_mapping functionVar
[all …]
H A Dscales-.r13 vapply(self$scales, function(x) any(aesthetic %in% x$aesthetics), logical(1))
25 prev_aes <- self$find(scale$aesthetics)
29 scalename <- self$scales[prev_aes][[1]]$aesthetics[1]
91 scales_add_defaults <- function(scales, data, aesthetics, env) { argument
92 if (is.null(aesthetics)) return()
93 names(aesthetics) <- unlist(lapply(names(aesthetics), aes_to_scale))
95 new_aesthetics <- setdiff(names(aesthetics), scales$input())
99 datacols <- lapply(aesthetics[new_aesthetics], eval_tidy, data = data)
110 scales_add_missing <- function(plot, aesthetics, env) { argument
113 aesthetics <- setdiff(aesthetics, plot$scales$input())
[all …]
H A Dscale-identity.r64 scale_colour_identity <- function(..., guide = "none", aesthetics = "colour") { argument
65 sc <- discrete_scale(aesthetics, "identity", identity_pal(), ..., guide = guide,
73 scale_fill_identity <- function(..., guide = "none", aesthetics = "fill") { argument
74 sc <- discrete_scale(aesthetics, "identity", identity_pal(), ..., guide = guide,
118 scale_discrete_identity <- function(aesthetics, ..., guide = "none") { argument
119 sc <- discrete_scale(aesthetics, "identity", identity_pal(), ..., guide = guide,
127 scale_continuous_identity <- function(aesthetics, ..., guide = "none") { argument
128 sc <- continuous_scale(aesthetics, "identity", identity_pal(), ..., guide = guide,
H A Dscale-hue.r54 direction = 1, na.value = "grey50", aesthetics = "colour") { argument
55 discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction),
62 direction = 1, na.value = "grey50", aesthetics = "fill") { argument
63 discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction),
154 direction = 1, na.value = "grey50", aesthetics = "colour") { argument
156 aesthetics, "qualitative", qualitative_pal(type, h, c, l, h.start, direction),
162 direction = 1, na.value = "grey50", aesthetics = "fill") { argument
164 aesthetics, "qualitative", qualitative_pal(type, h, c, l, h.start, direction),
H A Dscale-.r97 aesthetics <- standardise_aes_names(aesthetics)
124 aesthetics = aesthetics,
183 aesthetics <- standardise_aes_names(aesthetics)
212 aesthetics = aesthetics,
253 aesthetics <- standardise_aes_names(aesthetics)
278 aesthetics = aesthetics,
402 aesthetics = aes(),
427 aesthetics <- intersect(self$aesthetics, names(df)) functionVar
451 aesthetics <- intersect(self$aesthetics, names(df)) functionVar
468 aesthetics <- intersect(self$aesthetics, names(df)) functionVar
[all …]
H A Dcoord-cartesian-.r107 aesthetics <- c("x", "y", "x.sec", "y.sec") vector
108 names(aesthetics) <- aesthetics
111 guides <- lapply(aesthetics, function(aesthetic) {
126 guides <- lapply(aesthetics, function(aesthetic) {
139 aesthetics <- c("x", "y", "x.sec", "y.sec") vector
140 names(aesthetics) <- aesthetics
142 panel_params$guides <- lapply(aesthetics, function(aesthetic) {
204 aesthetic <- scale$aesthetics[1]
H A Dscale-manual.r85 scale_colour_manual <- function(..., values, aesthetics = "colour", breaks = waiver(), na.value = "… argument
86 manual_scale(aesthetics, values, breaks, ..., na.value = na.value)
91 scale_fill_manual <- function(..., values, aesthetics = "fill", breaks = waiver(), na.value = "grey… argument
92 manual_scale(aesthetics, values, breaks, ..., na.value = na.value)
121 scale_discrete_manual <- function(aesthetics, ..., values, breaks = waiver()) { argument
122 manual_scale(aesthetics, values, breaks, ...)
H A Dscale-grey.r28 scale_colour_grey <- function(..., start = 0.2, end = 0.8, na.value = "red", aesthetics = "colour")… argument
29 discrete_scale(aesthetics, "grey", grey_pal(start, end),
35 scale_fill_grey <- function(..., start = 0.2, end = 0.8, na.value = "red", aesthetics = "fill") { argument
36 discrete_scale(aesthetics, "grey", grey_pal(start, end),
H A Daes-evaluation.r95 is_calculated_aes <- function(aesthetics) { argument
96 vapply(aesthetics, is_calculated, logical(1), USE.NAMES = FALSE)
98 is_scaled_aes <- function(aesthetics) { argument
99 vapply(aesthetics, is_scaled, logical(1), USE.NAMES = FALSE)
101 is_staged_aes <- function(aesthetics) { argument
102 vapply(aesthetics, is_staged, logical(1), USE.NAMES = FALSE)
/dports/graphics/R-cran-colorspace/colorspace/R/
H A Dscale_qualitative.R36 … alpha = 1, rev = FALSE, nmax = NULL, order = NULL, aesthetics = "colour", argument
59 ggplot2::discrete_scale(aesthetics, "manual", pal, ...)
68 scale_fill_discrete_qualitative <- function(..., aesthetics = "fill") argument
72 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
127 ggplot2::continuous_scale(aesthetics, "continuous_qualitative",
139 scale_fill_continuous_qualitative <- function(..., aesthetics = "fill") argument
143 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
183 … guide = "coloursteps", aesthetics = "colour", n_interp = 11, ...) argument
198 aesthetics, "binned_qualitative",
212 scale_fill_binned_qualitative <- function(..., aesthetics = "fill") argument
[all …]
H A Dscale_sequential.R74 ggplot2::discrete_scale(aesthetics, "manual", pal, ...)
83 scale_fill_discrete_sequential <- function(..., aesthetics = "fill") argument
87 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
139 aesthetics = "colour", n_interp = 11, ...) argument
153 ggplot2::continuous_scale(aesthetics, "continuous_sequential",
165 scale_fill_continuous_sequential <- function(..., aesthetics = "fill") argument
169 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
209 aesthetics = "colour", n_interp = 11, ...) argument
224 aesthetics,
241 scale_fill_binned_sequential <- function(..., aesthetics = "fill") argument
[all …]
H A Dscale_diverging.R69 ggplot2::discrete_scale(aesthetics, "manual", pal, ...)
78 scale_fill_discrete_diverging <- function(..., aesthetics = "fill") argument
82 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
129 n_interp = 11, aesthetics = "colour", ...) argument
143 ggplot2::continuous_scale(aesthetics, "continuous_diverging",
155 scale_fill_continuous_diverging <- function(..., aesthetics = "fill") argument
159 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
203 n_interp = 11, aesthetics = "colour", ...) argument
218 aesthetics,
233 scale_fill_binned_diverging <- function(..., aesthetics = "fill") argument
[all …]
H A Dscale_divergingx.R46 aesthetics = "colour", ...) argument
69 ggplot2::discrete_scale(aesthetics, "manual", pal, ...)
78 scale_fill_discrete_divergingx <- function(..., aesthetics = "fill") argument
82 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
143 … guide = "colourbar", n_interp = 11, aesthetics = "colour", ...) argument
160 ggplot2::continuous_scale(aesthetics, "continuous_divergingx",
172 scale_fill_continuous_divergingx <- function(..., aesthetics = "fill") argument
176 if (is.null(args[["aesthetics"]])) args$aesthetics <- "fill"
250 aesthetics, "binned_divergingx",
263 scale_fill_binned_divergingx <- function(..., aesthetics = "fill") argument
[all …]
/dports/graphics/R-cran-ggplot2/ggplot2/man/
H A Dscale_identity.Rd15 scale_colour_identity(..., guide = "none", aesthetics = "colour")
17 scale_fill_identity(..., guide = "none", aesthetics = "fill")
27 scale_discrete_identity(aesthetics, ..., guide = "none")
29 scale_continuous_identity(aesthetics, ..., guide = "none")
37 \item{aesthetics}{Character string or vector of character strings listing the
39 example, to apply colour settings to the \code{colour} and \code{fill} aesthetics at the
40 same time, via \code{aesthetics = c("colour", "fill")}.}
50 etc. work on the aesthetics specified in the scale name: \code{colour}, \code{fill}, \code{size},
52 have an optional \code{aesthetics} argument that can be used to define both \code{colour} and
55 can work with any aesthetic or set of aesthetics provided via the \code{aesthetics}
H A Dstat_unique.Rd45 often aesthetics, used to set an aesthetic to a fixed value, like
53 \code{NA}, the default, includes if any aesthetics are mapped.
55 It can also be a named logical vector to finely select the aesthetics to
58 \item{inherit.aes}{If \code{FALSE}, overrides the default aesthetics,
60 that define both data and aesthetics and shouldn't inherit behaviour from
68 \code{stat_unique()} understands the following aesthetics (required aesthetics are in bold):
72 Learn more about setting these aesthetics in \code{vignette("ggplot2-specs")}.
H A Dgeom_abline.Rd56 often aesthetics, used to set an aesthetic to a fixed value, like
64 \code{NA}, the default, includes if any aesthetics are mapped.
66 It can also be a named logical vector to finely select the aesthetics to
81 or via aesthetics. If you use arguments, e.g.
85 to vary across facets, construct the data frame yourself and use aesthetics.
87 Unlike most other geoms, these geoms do not inherit aesthetics from the plot
88 default, because they do not understand x and y aesthetics which are
94 same aesthetics: \code{alpha}, \code{colour}, \code{linetype} and
95 \code{size}. They also each have aesthetics that control the position of
121 # To show different lines in different facets, use aesthetics
[all …]
H A Dgeom_contour.Rd97 often aesthetics, used to set an aesthetic to a fixed value, like
119 \code{NA}, the default, includes if any aesthetics are mapped.
121 It can also be a named logical vector to finely select the aesthetics to
124 \item{inherit.aes}{If \code{FALSE}, overrides the default aesthetics,
126 that define both data and aesthetics and shouldn't inherit behaviour from
146 \code{geom_contour()} understands the following aesthetics (required aesthetics are in bold):
157 Learn more about setting these aesthetics in \code{vignette("ggplot2-specs")}.
160 \code{geom_contour_filled()} understands the following aesthetics (required aesthetics are in bold):
172 Learn more about setting these aesthetics in \code{vignette("ggplot2-specs")}.
175 \code{stat_contour()} understands the following aesthetics (required aesthetics are in bold):
[all …]
H A Dgeom_qq.Rd93 often aesthetics, used to set an aesthetic to a fixed value, like
112 \code{NA}, the default, includes if any aesthetics are mapped.
114 It can also be a named logical vector to finely select the aesthetics to
117 \item{inherit.aes}{If \code{FALSE}, overrides the default aesthetics,
119 that define both data and aesthetics and shouldn't inherit behaviour from
129 \code{stat_qq()} understands the following aesthetics (required aesthetics are in bold):
136 Learn more about setting these aesthetics in \code{vignette("ggplot2-specs")}.
139 \code{stat_qq_line()} understands the following aesthetics (required aesthetics are in bold):
146 Learn more about setting these aesthetics in \code{vignette("ggplot2-specs")}.
H A Dgeom_errorbarh.Rd46 often aesthetics, used to set an aesthetic to a fixed value, like
54 \code{NA}, the default, includes if any aesthetics are mapped.
56 It can also be a named logical vector to finely select the aesthetics to
59 \item{inherit.aes}{If \code{FALSE}, overrides the default aesthetics,
61 that define both data and aesthetics and shouldn't inherit behaviour from
69 \code{geom_errorbarh()} understands the following aesthetics (required aesthetics are in bold):
81 Learn more about setting these aesthetics in \code{vignette("ggplot2-specs")}.
H A Dgeom_spoke.Rd47 often aesthetics, used to set an aesthetic to a fixed value, like
55 \code{NA}, the default, includes if any aesthetics are mapped.
57 It can also be a named logical vector to finely select the aesthetics to
60 \item{inherit.aes}{If \code{FALSE}, overrides the default aesthetics,
62 that define both data and aesthetics and shouldn't inherit behaviour from
72 \code{geom_spoke()} understands the following aesthetics (required aesthetics are in bold):
84 Learn more about setting these aesthetics in \code{vignette("ggplot2-specs")}.
H A Dscale_viridis.Rd25 aesthetics = "colour"
35 aesthetics = "fill"
49 aesthetics = "colour"
63 aesthetics = "fill"
77 aesthetics = "colour"
91 aesthetics = "fill"
113 \item{aesthetics}{Character string or vector of character strings listing the
115 example, to apply colour settings to the \code{colour} and \code{fill} aesthetics at the
116 same time, via \code{aesthetics = c("colour", "fill")}.}

12345678910>>...23