Skip to content

Commit 2d2e2d9

Browse files
authored
Merge branch 'tidyverse:main' into main
2 parents 466a424 + fc191a0 commit 2d2e2d9

File tree

4 files changed

+5
-2
lines changed

4 files changed

+5
-2
lines changed

R/aes.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -268,7 +268,7 @@ aes_ <- function(x, y, ...) {
268268
deprecate_soft0(
269269
"3.0.0",
270270
"aes_()",
271-
details = "Please use tidy evaluation ideoms with `aes()`"
271+
details = "Please use tidy evaluation idioms with `aes()`"
272272
)
273273
mapping <- list(...)
274274
if (!missing(x)) mapping["x"] <- list(x)

R/geom-.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -240,7 +240,7 @@ check_aesthetics <- function(x, n) {
240240

241241
check_linewidth <- function(data, name) {
242242
if (is.null(data$linewidth) && !is.null(data$size)) {
243-
deprecate_soft0("3.4.0", I(paste0("Using the `size` aesthietic with ", name)), I("the `linewidth` aesthetic"))
243+
deprecate_soft0("3.4.0", I(paste0("Using the `size` aesthetic with ", name)), I("the `linewidth` aesthetic"))
244244
data$linewidth <- data$size
245245
}
246246
data

tests/testthat/test-geom-hex.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,5 @@
1+
skip_if_not_installed("hexbin")
2+
13
test_that("density and value summaries are available", {
24
df <- data_frame(x = c(1, 1, 1, 2), y = c(1, 1, 1, 2))
35
base <- ggplot(df, aes(x, y)) +

tests/testthat/test-stat-hex.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,4 @@
1+
skip_if_not_installed("hexbin")
12
test_that("can use length 1 binwidth", {
23
df <- data_frame(x = c(1, 1, 2), y = c(1, 1, 2))
34
p <- ggplot(df, aes(x, y)) + stat_binhex(binwidth = 1)

0 commit comments

Comments
 (0)