Skip to content

Commit eef7ef7

Browse files
committed
prevent partial matching of label parameter
1 parent 42bc5ff commit eef7ef7

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/layer.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -167,7 +167,7 @@ layer <- function(geom = NULL, stat = NULL,
167167
if (check.aes && length(extra_aes) > 0) {
168168
cli::cli_warn("Ignoring unknown aesthetics: {.field {extra_aes}}", call = call_env)
169169
}
170-
aes_params$label <- normalise_label(aes_params$label)
170+
aes_params[["label"]] <- normalise_label(aes_params[["label"]])
171171

172172
# adjust the legend draw key if requested
173173
geom <- set_draw_key(geom, key_glyph %||% params$key_glyph)

0 commit comments

Comments
 (0)