Skip to content

Commit 55f1b71

Browse files
committed
rename the test result
1 parent 350721d commit 55f1b71

File tree

2 files changed

+3
-3
lines changed

2 files changed

+3
-3
lines changed

tests/testthat/_snaps/guide-axis/guide-axis-theta-with-only-one-axis-value.svg renamed to tests/testthat/_snaps/guide-axis/guide-axis-theta-with-only-one-axis-key.svg

Lines changed: 1 addition & 1 deletion
Loading

tests/testthat/test-guide-axis.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -382,12 +382,12 @@ test_that("guide_axis_theta sets relative angle", {
382382
expect_doppelganger("guide_axis_theta with angle adapting to theta", p)
383383
})
384384

385-
test_that("guide_axis_theta with only one axis value", {
385+
test_that("guide_axis_theta with only one axis key", {
386386
p <- ggplot(data.frame(x = "a", y = 1:3), aes(x, y)) +
387387
geom_point() +
388388
coord_radial(start = 0, end = pi / 2, inner.radius = 0.5) +
389389
guides(theta = guide_axis_theta(angle = 0))
390-
expect_doppelganger("guide_axis_theta with only one axis value", p)
390+
expect_doppelganger("guide_axis_theta with only one axis key", p)
391391
})
392392

393393
test_that("guide_axis_theta can be used in cartesian coordinates", {

0 commit comments

Comments
 (0)