Skip to content

Commit cab4b64

Browse files
authored
Ensure attributes _and_ length are identical in gradethis_equal.list() (#354)
1 parent f354906 commit cab4b64

File tree

2 files changed

+13
-4
lines changed

2 files changed

+13
-4
lines changed

R/gradethis_equal.R

+9-4
Original file line numberDiff line numberDiff line change
@@ -66,14 +66,19 @@ gradethis_equal.list <- function(
6666
NextMethod()
6767
}
6868

69-
# First check if the lengths are the same
69+
# First check with `identical()`, since it's fast
70+
if (identical(x, y)) {
71+
return(TRUE)
72+
}
73+
74+
# Then check if the lengths are the same
7075
if (length(x) != length(y)) {
7176
return(FALSE)
7277
}
7378

74-
# Then check with `identical()`, since it's fast
75-
if (identical(x, y)) {
76-
return(TRUE)
79+
# Then check if the attributes are the same
80+
if (!identical(attributes(x), attributes(y))) {
81+
return(FALSE)
7782
}
7883

7984
# If `identical()` returned `FALSE`, map over each element individually,

tests/testthat/test-gradethis_equal.R

+4
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
test_that("gradethis_equal.list() checks names", {
2+
expect_false(gradethis_equal(list(pi, letters), list(a = pi, b = letters)))
3+
})
4+
15
test_that("gradethis_equal uses methods from ggcheck", {
26
skip_if_not_installed("ggcheck", "0.0.5")
37
skip_if_not_installed("ggplot2")

0 commit comments

Comments
 (0)