waldo icon indicating copy to clipboard operation
waldo copied to clipboard

Find differences between R objects

Results 27 waldo issues
Sort by recently updated
recently updated
newest added

``` r a1 setting value #> version R version 4.1.1 (2021-08-10) #> os macOS Big Sur 10.16 #> system x86_64, darwin17.0 #> ui X11 #> language (EN) #> collate en_US.UTF-8...

Occasionally, I'll compare two largeish tibbles where the only difference will be the sort order (although I don't know that for certain going in, hence the use of `waldo`). I...

``` r waldo::compare(1 + 1i, 10 + 10i) #> Warning in sprintf(paste0("%0.", digits, "f"), x): imaginary parts discarded in #> coercion #> Warning in sprintf(paste0("%0.", digits, "f"), x): imaginary parts...

For use with `expect_snapshot()`

``` r waldo::compare(1, structure(1, class="a"), ignore_attr = "class", tolerance = 1e-6) #> ✔ No differences waldo::compare(1, structure(1, class="a"), ignore_attr = "class") #> `old` is a double vector (1) #> `new`...

## Problem Comparing large (>1e6) integer vectors can be prohibitively slow after shuffling one vector. RE: #116 I tried setting `options(diffobj.max.diffs = 50)`, but this didn't help. ## Reprex ```r...

feature

i.e. this was somewhat confusing: ``` r waldo::compare(-0.9090909, 0.9090909) #> `old`: -1 #> `new`: 1 ``` Reminder to look into `scales::precision` to see if it has any better logic

bug

``` r library(waldo) dt `old`: "2016-07-18 16:06:00" #> `new`: "2016-07-18 16:06:05" compare(1468857960, 1468857965) #> `old`: 1468857960 #> `new`: 1468857965 (tol [1] 1.490116e-08 compare(dt, dt + 5, tolerance = tol) #>...

feature

`NA` values are not displayed. This happens with the current CRAN and the current dev version ``` r waldo::compare( c(NA, 1), 1 ) #> `old`: 1 #> `new`: 1 ```...