Last updated on 2023-03-20 16:52:08 CET.
Flavor | Version | Tinstall | Tcheck | Ttotal | Status | Flags |
---|---|---|---|---|---|---|
r-devel-linux-x86_64-debian-clang | 1.3.0 | NOTE | ||||
r-devel-linux-x86_64-debian-gcc | 1.3.0 | 14.13 | 131.04 | 145.17 | ERROR | |
r-devel-linux-x86_64-fedora-clang | 1.3.0 | 244.86 | NOTE | |||
r-devel-linux-x86_64-fedora-gcc | 1.3.0 | 243.29 | NOTE | |||
r-patched-linux-x86_64 | 1.3.0 | 17.12 | 167.49 | 184.61 | OK | |
r-release-linux-x86_64 | 1.3.0 | 16.61 | 167.34 | 183.95 | OK | |
r-release-macos-arm64 | 1.3.0 | 66.00 | OK | |||
r-release-macos-x86_64 | 1.3.0 | 89.00 | OK | |||
r-release-windows-x86_64 | 1.3.0 | 101.00 | 212.00 | 313.00 | OK | |
r-oldrel-macos-arm64 | 1.3.0 | 78.00 | OK | |||
r-oldrel-macos-x86_64 | 1.3.0 | 100.00 | OK | |||
r-oldrel-windows-ix86+x86_64 | 1.3.0 | 48.00 | 304.00 | 352.00 | OK |
Version: 1.3.0
Check: C++ specification
Result: NOTE
Specified C++11: please drop specification unless essential
Flavors: r-devel-linux-x86_64-debian-clang, r-devel-linux-x86_64-debian-gcc, r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc
Version: 1.3.0
Check: examples
Result: ERROR
Running examples in ‘tidyr-Ex.R’ failed
The error most likely occurred in:
> base::assign(".ptime", proc.time(), pos = "CheckExEnv")
> ### Name: expand
> ### Title: Expand data frame to include all possible combinations of values
> ### Aliases: expand crossing nesting
>
> ### ** Examples
>
> # Finding combinations ------------------------------------------------------
> fruits <- tibble(
+ type = c("apple", "orange", "apple", "orange", "orange", "orange"),
+ year = c(2010, 2010, 2012, 2010, 2011, 2012),
+ size = factor(
+ c("XS", "S", "M", "S", "S", "M"),
+ levels = c("XS", "S", "M", "L")
+ ),
+ weights = rnorm(6, as.numeric(size) + 2)
+ )
>
> # All combinations, including factor levels that are not used
> fruits %>% expand(type)
# A tibble: 2 × 1
type
<chr>
1 apple
2 orange
> fruits %>% expand(size)
# A tibble: 4 × 1
size
<fct>
1 XS
2 S
3 M
4 L
> fruits %>% expand(type, size)
# A tibble: 8 × 2
type size
<chr> <fct>
1 apple XS
2 apple S
3 apple M
4 apple L
5 orange XS
6 orange S
7 orange M
8 orange L
> fruits %>% expand(type, size, year)
# A tibble: 24 × 3
type size year
<chr> <fct> <dbl>
1 apple XS 2010
2 apple XS 2011
3 apple XS 2012
4 apple S 2010
5 apple S 2011
6 apple S 2012
7 apple M 2010
8 apple M 2011
9 apple M 2012
10 apple L 2010
# … with 14 more rows
>
> # Only combinations that already appear in the data
> fruits %>% expand(nesting(type))
# A tibble: 2 × 1
type
<chr>
1 apple
2 orange
> fruits %>% expand(nesting(size))
# A tibble: 3 × 1
size
<fct>
1 XS
2 S
3 M
> fruits %>% expand(nesting(type, size))
# A tibble: 4 × 2
type size
<chr> <fct>
1 apple XS
2 apple M
3 orange S
4 orange M
> fruits %>% expand(nesting(type, size, year))
# A tibble: 5 × 3
type size year
<chr> <fct> <dbl>
1 apple XS 2010
2 apple M 2012
3 orange S 2010
4 orange S 2011
5 orange M 2012
>
> # Other uses ----------------------------------------------------------------
> # Use with `full_seq()` to fill in values of continuous variables
> fruits %>% expand(type, size, full_seq(year, 1))
# A tibble: 24 × 3
type size `full_seq(year, 1)`
<chr> <fct> <dbl>
1 apple XS 2010
2 apple XS 2011
3 apple XS 2012
4 apple S 2010
5 apple S 2011
6 apple S 2012
7 apple M 2010
8 apple M 2011
9 apple M 2012
10 apple L 2010
# … with 14 more rows
> fruits %>% expand(type, size, 2010:2013)
# A tibble: 32 × 3
type size `2010:2013`
<chr> <fct> <int>
1 apple XS 2010
2 apple XS 2011
3 apple XS 2012
4 apple XS 2013
5 apple S 2010
6 apple S 2011
7 apple S 2012
8 apple S 2013
9 apple M 2010
10 apple M 2011
# … with 22 more rows
>
> # Use `anti_join()` to determine which observations are missing
> all <- fruits %>% expand(type, size, year)
> all
# A tibble: 24 × 3
type size year
<chr> <fct> <dbl>
1 apple XS 2010
2 apple XS 2011
3 apple XS 2012
4 apple S 2010
5 apple S 2011
6 apple S 2012
7 apple M 2010
8 apple M 2011
9 apple M 2012
10 apple L 2010
# … with 14 more rows
> all %>% dplyr::anti_join(fruits)
Joining with `by = join_by(type, size, year)`
# A tibble: 19 × 3
type size year
<chr> <fct> <dbl>
1 apple XS 2011
2 apple XS 2012
3 apple S 2010
4 apple S 2011
5 apple S 2012
6 apple M 2010
7 apple M 2011
8 apple L 2010
9 apple L 2011
10 apple L 2012
11 orange XS 2010
12 orange XS 2011
13 orange XS 2012
14 orange S 2012
15 orange M 2010
16 orange M 2011
17 orange L 2010
18 orange L 2011
19 orange L 2012
>
> # Use with `right_join()` to fill in missing rows (like `complete()`)
> fruits %>% dplyr::right_join(all)
Joining with `by = join_by(type, year, size)`
Error in vectbl_assign(x[[j]], i, recycled_value[[j]]) :
DLL requires the use of native symbols
Calls: %>% ... tbl_subassign_row -> withCallingHandlers -> vectbl_assign
Execution halted
Flavor: r-devel-linux-x86_64-debian-gcc
Version: 1.3.0
Check: tests
Result: ERROR
Running ‘testthat.R’ [49s/77s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(tidyr)
Attaching package: 'tidyr'
The following object is masked from 'package:testthat':
matches
>
> test_check("tidyr")
[ FAIL 4 | WARN 0 | SKIP 148 | PASS 1097 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (148)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-complete.R:115:3'): not drop unspecified levels in complete ────
Error in `vectbl_assign(x[[j]], i, recycled_value[[j]])`: DLL requires the use of native symbols
Backtrace:
▆
1. ├─df %>% complete(z = c("a", "b")) at test-complete.R:115:2
2. ├─tidyr::complete(., z = c("a", "b"))
3. └─tidyr:::complete.data.frame(., z = c("a", "b"))
4. ├─dplyr::full_join(out, data, by = names, multiple = "all")
5. └─dplyr:::full_join.data.frame(out, data, by = names, multiple = "all")
6. └─dplyr:::join_mutate(...)
7. ├─base::`[<-`(`*tmp*`, new_rows, merge, value = `<tibble[,1]>`)
8. └─tibble:::`[<-.tbl_df`(`*tmp*`, new_rows, merge, value = `<tibble[,1]>`)
9. └─tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value))
10. └─tibble:::tbl_subassign_row(xj, i, value, i_arg, value_arg, call)
11. ├─base::withCallingHandlers(...)
12. └─tibble:::vectbl_assign(x[[j]], i, recycled_value[[j]])
── Error ('test-separate-wider.R:180:3'): separate_wider_regex() can silence errors ──
Error in `vectbl_assign(x[[j]], i, recycled_value[[j]])`: DLL requires the use of native symbols
Backtrace:
▆
1. ├─df %>% ... at test-separate-wider.R:180:2
2. └─tidyr::separate_wider_regex(...)
3. └─tidyr:::map_unpack(...)
4. └─tidyr (local) fun(data[[col]], col)
5. └─tidyr:::str_separate_wider_regex(...)
6. ├─base::`[<-`(`*tmp*`, match_idx, cols, value = `<tibble[,1]>`)
7. └─tibble:::`[<-.tbl_df`(`*tmp*`, match_idx, cols, value = `<tibble[,1]>`)
8. └─tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value))
9. └─tibble:::tbl_subassign_row(xj, i, value, i_arg, value_arg, call)
10. ├─base::withCallingHandlers(...)
11. └─tibble:::vectbl_assign(x[[j]], i, recycled_value[[j]])
── Error ('test-separate-wider.R:191:3'): separate_wider_regex() can diagnose errors ──
`{ ... }` threw an unexpected error.
Message: DLL requires the use of native symbols
Class: simpleError/error/condition
── Error ('test-separate-wider.R:198:3'): separate_wider_regex() can diagnose errors ──
Error in `eval(code, test_env)`: object 'out' not found
Backtrace:
▆
1. └─testthat::expect_equal(out$x, df$x) at test-separate-wider.R:198:2
2. └─testthat::quasi_label(enquo(object), label, arg = "object")
3. └─rlang::eval_bare(expr, quo_get_env(quo))
[ FAIL 4 | WARN 0 | SKIP 148 | PASS 1097 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-debian-gcc
Version: 1.3.0
Check: data for non-ASCII characters
Result: NOTE
Note: found 24 marked UTF-8 strings
Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc