We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 64221aa commit f40d45eCopy full SHA for f40d45e
R/utils.r
@@ -114,3 +114,11 @@ fix_call <- function(expr, call = caller_env()) {
114
...elt2 <- function(i, frame = caller_env()) {
115
eval_bare(sym(paste0("..", i)), frame)
116
}
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