Skip to content

Commit 0c7eda0

Browse files
schloerkehadley
authored andcommitted
Aes format ticks are not formatted properly (#2613)
* move fancy tick marks inside format call * globalVariables use utils package
1 parent 2b0a954 commit 0c7eda0

File tree

3 files changed

+3
-3
lines changed

3 files changed

+3
-3
lines changed

R/aes.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -128,7 +128,7 @@ print.uneval <- function(x, ...) {
128128
cat("<empty>\n")
129129
} else {
130130
values <- vapply(x, rlang::quo_label, character(1))
131-
bullets <- paste0("* `", format(names(x)), "` -> ", values, "\n")
131+
bullets <- paste0("* ", format(paste0("`", names(x), "`")), " -> ", values, "\n")
132132

133133
cat(bullets, sep = "")
134134
}

R/guide-legend.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -745,4 +745,4 @@ label_just_defaults.legend <- function(direction, position) {
745745
}
746746

747747

748-
globalVariables(c("C", "R", "key.row", "key.col", "label.row", "label.col"))
748+
utils::globalVariables(c("C", "R", "key.row", "key.col", "label.row", "label.col"))

R/labeller.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -230,7 +230,7 @@ label_bquote <- function(rows = NULL, cols = NULL,
230230

231231
structure(fun, class = "labeller")
232232
}
233-
globalVariables(c("x", "."))
233+
utils::globalVariables(c("x", "."))
234234

235235
#' @rdname labellers
236236
#' @export

0 commit comments

Comments
 (0)