Skip to content

Commit f40d45e

Browse files
committed
Quiet test errors
1 parent 64221aa commit f40d45e

File tree

1 file changed

+8
-0
lines changed

1 file changed

+8
-0
lines changed

R/utils.r

Lines changed: 8 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -114,3 +114,11 @@ fix_call <- function(expr, call = caller_env()) {
114114
...elt2 <- function(i, frame = caller_env()) {
115115
eval_bare(sym(paste0("..", i)), frame)
116116
}
117+
118+
# Stop tests from failing due to new attribute
119+
# TODO: make this only affect tests
120+
compare_proxy.data.frame <- function(x, path = "x") {
121+
attr(x, "pillar_focus") <- NULL
122+
list(object = x, path = path)
123+
}
124+
on_load(s3_register("waldo::compare_proxy", "data.frame"))

0 commit comments

Comments
 (0)