Skip to content

Commit

Permalink
Quiet test errors
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley authored and krlmlr committed Aug 28, 2022
1 parent 7006d95 commit 75fa45e
Showing 1 changed file with 8 additions and 0 deletions.
8 changes: 8 additions & 0 deletions R/utils.r
Original file line number Diff line number Diff line change
Expand Up @@ -66,3 +66,11 @@ node_walk_replace <- function(node, old, new) {
node <- node_cdr(node)
}
}

# Stop tests from failing due to new attribute
# TODO: make this only affect tests
compare_proxy.data.frame <- function(x, path = "x") {
attr(x, "pillar_focus") <- NULL
list(object = x, path = path)
}
on_load(s3_register("waldo::compare_proxy", "data.frame"))

0 comments on commit 75fa45e

Please sign in to comment.