Skip to content

Commit 2e9ceb7

Browse files
authored
Only use data_frame in tests (#3003)
1 parent 4380cb9 commit 2e9ceb7

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/stat-contour.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -97,7 +97,7 @@ contour_lines <- function(data, breaks, complete = FALSE) {
9797
x = xs,
9898
y = ys,
9999
piece = pieces,
100-
group = groups
100+
group = factor(groups)
101101
), n = length(xs))
102102
}
103103

tests/testthat/test-layer.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -39,7 +39,7 @@ test_that("missing aesthetics trigger informative error", {
3939
})
4040

4141
test_that("if an aes is mapped to a function that returns NULL, it is removed", {
42-
df <- data.frame(x = 1:10)
42+
df <- data_frame(x = 1:10)
4343
null <- function(...) NULL
4444
p <- cdata(ggplot(df, aes(x, null())))
4545
expect_identical(names(p[[1]]), c("x", "PANEL", "group"))

0 commit comments

Comments
 (0)