Last updated on 2022-05-16 05:50:24 CEST.
Flavor | Version | Tinstall | Tcheck | Ttotal | Status | Flags |
---|---|---|---|---|---|---|
r-devel-linux-x86_64-debian-clang | 1.3.1 | 7.13 | 432.26 | 439.39 | NOTE | |
r-devel-linux-x86_64-debian-gcc | 1.3.1 | 5.30 | 296.07 | 301.37 | ERROR | |
r-devel-linux-x86_64-fedora-clang | 1.3.1 | 511.98 | ERROR | |||
r-devel-linux-x86_64-fedora-gcc | 1.3.1 | 513.05 | ERROR | |||
r-devel-windows-x86_64 | 1.3.1 | 110.00 | 412.00 | 522.00 | ERROR | |
r-patched-linux-x86_64 | 1.3.1 | 8.84 | 387.14 | 395.98 | ERROR | |
r-release-linux-x86_64 | 1.3.1 | 6.75 | 399.10 | 405.85 | ERROR | |
r-release-macos-arm64 | 1.3.1 | 131.00 | OK | |||
r-release-macos-x86_64 | 1.3.1 | 242.00 | OK | |||
r-release-windows-x86_64 | 1.3.1 | 129.00 | 395.00 | 524.00 | ERROR | |
r-oldrel-macos-arm64 | 1.3.1 | 105.00 | OK | |||
r-oldrel-macos-x86_64 | 1.3.1 | 157.00 | NOTE | |||
r-oldrel-windows-ix86+x86_64 | 1.3.1 | 26.00 | 463.00 | 489.00 | WARN |
Version: 1.3.1
Check: package dependencies
Result: NOTE
Package suggested but not available for checking: 'metaplus'
Flavor: r-devel-linux-x86_64-debian-clang
Version: 1.3.1
Check: examples
Result: ERROR
Running examples in ‘statsExpressions-Ex.R’ failed
The error most likely occurred in:
> base::assign(".ptime", proc.time(), pos = "CheckExEnv")
> ### Name: centrality_description
> ### Title: Dataframe and expression for distribution properties
> ### Aliases: centrality_description
>
> ### ** Examples
>
>
> set.seed(123)
>
> # parametric -----------------------
> centrality_description(iris, Species, Sepal.Length)
Error in `mutate()`:
! Problem while computing `n_label = paste0(Species, "\n(n = ",
.prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─statsExpressions::centrality_description(iris, Species, Sepal.Length)
2. │ └─... %>% ...
3. ├─dplyr::select(...)
4. ├─dplyr::arrange(...)
5. ├─dplyr::mutate(...)
6. ├─dplyr:::mutate.data.frame(...)
7. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
8. │ ├─base::withCallingHandlers(...)
9. │ └─mask$eval_all_mutate(quo)
10. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
11. ├─statsExpressions:::.prettyNum(n)
12. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
13. │ └─base::vapply(...)
14. └─base::.handleSimpleError(...)
15. └─dplyr h(simpleError(msg, call))
16. └─rlang::abort(...)
Execution halted
Flavors: r-devel-linux-x86_64-debian-gcc, r-patched-linux-x86_64, r-release-linux-x86_64
Version: 1.3.1
Check: tests
Result: ERROR
Running ‘spelling.R’ [0s/1s]
Running ‘testthat.R’ [199s/330s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(dplyr)
Attaching package: 'dplyr'
The following object is masked from 'package:testthat':
matches
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
> library(statsExpressions)
>
> ## pretty tibble printing
> options(
+ tibble.width = Inf,
+ pillar.bold = TRUE,
+ pillar.neg = TRUE,
+ pillar.subtle_num = TRUE,
+ pillar.min_chars = Inf
+ )
>
> test_check("statsExpressions")
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
t is large; approximation invoked.
Multiple `BFBayesFactor` models detected - posteriors are extracted from the first numerator model.
See help("get_parameters", package = "insight").
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (44)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test-centrality_description.R:8:5): contingency_table works ──────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `mutate(., expression = glue("widehat(mu)[{centrality}]=='{format_value(estimate, k)}'"),
n_label = paste0({
{
x
}
}, "\n(n = ", .prettyNum(n), ")"))`: Problem while computing `n_label = paste0(Species, "\n(n = ", .prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─purrr::pmap_dfr(...) at test-centrality_description.R:8:4
2. │ └─purrr::pmap(.l, .f, ...)
3. │ └─statsExpressions .f(...)
4. │ └─... %>% ...
5. ├─dplyr::select(...)
6. ├─dplyr::arrange(...)
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
10. │ ├─base::withCallingHandlers(...)
11. │ └─mask$eval_all_mutate(quo)
12. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
13. ├─statsExpressions:::.prettyNum(n)
14. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
15. │ └─base::vapply(...)
16. └─base::.handleSimpleError(...)
17. └─dplyr h(simpleError(msg, call))
18. └─rlang::abort(...)
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-debian-gcc
Version: 1.3.1
Check: examples
Result: ERROR
Running examples in ‘statsExpressions-Ex.R’ failed
The error most likely occurred in:
> ### Name: centrality_description
> ### Title: Dataframe and expression for distribution properties
> ### Aliases: centrality_description
>
> ### ** Examples
>
>
> set.seed(123)
>
> # parametric -----------------------
> centrality_description(iris, Species, Sepal.Length)
Error in `mutate()`:
! Problem while computing `n_label = paste0(Species, "\n(n = ",
.prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─statsExpressions::centrality_description(iris, Species, Sepal.Length)
2. │ └─... %>% ...
3. ├─dplyr::select(...)
4. ├─dplyr::arrange(...)
5. ├─dplyr::mutate(...)
6. ├─dplyr:::mutate.data.frame(...)
7. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
8. │ ├─base::withCallingHandlers(...)
9. │ └─mask$eval_all_mutate(quo)
10. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
11. ├─statsExpressions:::.prettyNum(n)
12. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
13. │ └─base::vapply(...)
14. └─base::.handleSimpleError(...)
15. └─dplyr h(simpleError(msg, call))
16. └─rlang::abort(...)
Execution halted
Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc, r-devel-windows-x86_64, r-release-windows-x86_64
Version: 1.3.1
Check: tests
Result: ERROR
Running ‘spelling.R’
Running ‘testthat.R’ [341s/537s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(dplyr)
Attaching package: 'dplyr'
The following object is masked from 'package:testthat':
matches
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
> library(statsExpressions)
>
> ## pretty tibble printing
> options(
+ tibble.width = Inf,
+ pillar.bold = TRUE,
+ pillar.neg = TRUE,
+ pillar.subtle_num = TRUE,
+ pillar.min_chars = Inf
+ )
>
> test_check("statsExpressions")
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
t is large; approximation invoked.
Multiple `BFBayesFactor` models detected - posteriors are extracted from the first numerator model.
See help("get_parameters", package = "insight").
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (44)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test-centrality_description.R:8:5): contingency_table works ──────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `mutate(., expression = glue("widehat(mu)[{centrality}]=='{format_value(estimate, k)}'"),
n_label = paste0({
{
x
}
}, "\n(n = ", .prettyNum(n), ")"))`: Problem while computing `n_label = paste0(Species, "\n(n = ", .prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─purrr::pmap_dfr(...) at test-centrality_description.R:8:4
2. │ └─purrr::pmap(.l, .f, ...)
3. │ └─statsExpressions .f(...)
4. │ └─... %>% ...
5. ├─dplyr::select(...)
6. ├─dplyr::arrange(...)
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
10. │ ├─base::withCallingHandlers(...)
11. │ └─mask$eval_all_mutate(quo)
12. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
13. ├─statsExpressions:::.prettyNum(n)
14. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
15. │ └─base::vapply(...)
16. └─base::.handleSimpleError(...)
17. └─dplyr h(simpleError(msg, call))
18. └─rlang::abort(...)
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-fedora-clang
Version: 1.3.1
Check: tests
Result: ERROR
Running ‘spelling.R’
Running ‘testthat.R’ [347s/515s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(dplyr)
Attaching package: 'dplyr'
The following object is masked from 'package:testthat':
matches
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
> library(statsExpressions)
>
> ## pretty tibble printing
> options(
+ tibble.width = Inf,
+ pillar.bold = TRUE,
+ pillar.neg = TRUE,
+ pillar.subtle_num = TRUE,
+ pillar.min_chars = Inf
+ )
>
> test_check("statsExpressions")
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
t is large; approximation invoked.
Multiple `BFBayesFactor` models detected - posteriors are extracted from the first numerator model.
See help("get_parameters", package = "insight").
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (44)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test-centrality_description.R:8:5): contingency_table works ──────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `mutate(., expression = glue("widehat(mu)[{centrality}]=='{format_value(estimate, k)}'"),
n_label = paste0({
{
x
}
}, "\n(n = ", .prettyNum(n), ")"))`: Problem while computing `n_label = paste0(Species, "\n(n = ", .prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─purrr::pmap_dfr(...) at test-centrality_description.R:8:4
2. │ └─purrr::pmap(.l, .f, ...)
3. │ └─statsExpressions .f(...)
4. │ └─... %>% ...
5. ├─dplyr::select(...)
6. ├─dplyr::arrange(...)
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
10. │ ├─base::withCallingHandlers(...)
11. │ └─mask$eval_all_mutate(quo)
12. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
13. ├─statsExpressions:::.prettyNum(n)
14. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
15. │ └─base::vapply(...)
16. └─base::.handleSimpleError(...)
17. └─dplyr h(simpleError(msg, call))
18. └─rlang::abort(...)
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc
Version: 1.3.1
Check: tests
Result: ERROR
Running 'spelling.R' [0s]
Running 'testthat.R' [266s]
Running the tests in 'tests/testthat.R' failed.
Complete output:
> library(testthat)
> library(dplyr)
Attaching package: 'dplyr'
The following object is masked from 'package:testthat':
matches
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
> library(statsExpressions)
>
> ## pretty tibble printing
> options(
+ tibble.width = Inf,
+ pillar.bold = TRUE,
+ pillar.neg = TRUE,
+ pillar.subtle_num = TRUE,
+ pillar.min_chars = Inf
+ )
>
> test_check("statsExpressions")
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
t is large; approximation invoked.
Multiple `BFBayesFactor` models detected - posteriors are extracted from the first numerator model.
See help("get_parameters", package = "insight").
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (44)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test-centrality_description.R:8:5): contingency_table works ──────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `mutate(., expression = glue("widehat(mu)[{centrality}]=='{format_value(estimate, k)}'"),
n_label = paste0({
{
x
}
}, "\n(n = ", .prettyNum(n), ")"))`: Problem while computing `n_label = paste0(Species, "\n(n = ", .prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─purrr::pmap_dfr(...) at test-centrality_description.R:8:4
2. │ └─purrr::pmap(.l, .f, ...)
3. │ └─statsExpressions .f(...)
4. │ └─... %>% ...
5. ├─dplyr::select(...)
6. ├─dplyr::arrange(...)
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
10. │ ├─base::withCallingHandlers(...)
11. │ └─mask$eval_all_mutate(quo)
12. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
13. ├─statsExpressions:::.prettyNum(n)
14. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
15. │ └─base::vapply(...)
16. └─base::.handleSimpleError(...)
17. └─dplyr h(simpleError(msg, call))
18. └─rlang::abort(...)
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
Error: Test failures
Execution halted
Flavor: r-devel-windows-x86_64
Version: 1.3.1
Check: tests
Result: ERROR
Running ‘spelling.R’ [0s/1s]
Running ‘testthat.R’ [266s/312s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(dplyr)
Attaching package: 'dplyr'
The following object is masked from 'package:testthat':
matches
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
> library(statsExpressions)
>
> ## pretty tibble printing
> options(
+ tibble.width = Inf,
+ pillar.bold = TRUE,
+ pillar.neg = TRUE,
+ pillar.subtle_num = TRUE,
+ pillar.min_chars = Inf
+ )
>
> test_check("statsExpressions")
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
t is large; approximation invoked.
Multiple `BFBayesFactor` models detected - posteriors are extracted from the first numerator model.
See help("get_parameters", package = "insight").
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (44)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test-centrality_description.R:8:5): contingency_table works ──────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `mutate(., expression = glue("widehat(mu)[{centrality}]=='{format_value(estimate, k)}'"),
n_label = paste0({
{
x
}
}, "\n(n = ", .prettyNum(n), ")"))`: Problem while computing `n_label = paste0(Species, "\n(n = ", .prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─purrr::pmap_dfr(...) at test-centrality_description.R:8:4
2. │ └─purrr::pmap(.l, .f, ...)
3. │ └─statsExpressions .f(...)
4. │ └─... %>% ...
5. ├─dplyr::select(...)
6. ├─dplyr::arrange(...)
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
10. │ ├─base::withCallingHandlers(...)
11. │ └─mask$eval_all_mutate(quo)
12. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
13. ├─statsExpressions:::.prettyNum(n)
14. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
15. │ └─base::vapply(...)
16. └─base::.handleSimpleError(...)
17. └─dplyr h(simpleError(msg, call))
18. └─rlang::abort(...)
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
Error: Test failures
Execution halted
Flavor: r-patched-linux-x86_64
Version: 1.3.1
Check: tests
Result: ERROR
Running ‘spelling.R’ [0s/1s]
Running ‘testthat.R’ [275s/337s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(dplyr)
Attaching package: 'dplyr'
The following object is masked from 'package:testthat':
matches
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
> library(statsExpressions)
>
> ## pretty tibble printing
> options(
+ tibble.width = Inf,
+ pillar.bold = TRUE,
+ pillar.neg = TRUE,
+ pillar.subtle_num = TRUE,
+ pillar.min_chars = Inf
+ )
>
> test_check("statsExpressions")
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
t is large; approximation invoked.
Multiple `BFBayesFactor` models detected - posteriors are extracted from the first numerator model.
See help("get_parameters", package = "insight").
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (44)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test-centrality_description.R:8:5): contingency_table works ──────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `mutate(., expression = glue("widehat(mu)[{centrality}]=='{format_value(estimate, k)}'"),
n_label = paste0({
{
x
}
}, "\n(n = ", .prettyNum(n), ")"))`: Problem while computing `n_label = paste0(Species, "\n(n = ", .prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─purrr::pmap_dfr(...) at test-centrality_description.R:8:4
2. │ └─purrr::pmap(.l, .f, ...)
3. │ └─statsExpressions .f(...)
4. │ └─... %>% ...
5. ├─dplyr::select(...)
6. ├─dplyr::arrange(...)
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
10. │ ├─base::withCallingHandlers(...)
11. │ └─mask$eval_all_mutate(quo)
12. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
13. ├─statsExpressions:::.prettyNum(n)
14. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
15. │ └─base::vapply(...)
16. └─base::.handleSimpleError(...)
17. └─dplyr h(simpleError(msg, call))
18. └─rlang::abort(...)
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
Error: Test failures
Execution halted
Flavor: r-release-linux-x86_64
Version: 1.3.1
Check: tests
Result: ERROR
Running 'spelling.R' [0s]
Running 'testthat.R' [242s]
Running the tests in 'tests/testthat.R' failed.
Complete output:
> library(testthat)
> library(dplyr)
Attaching package: 'dplyr'
The following object is masked from 'package:testthat':
matches
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
> library(statsExpressions)
>
> ## pretty tibble printing
> options(
+ tibble.width = Inf,
+ pillar.bold = TRUE,
+ pillar.neg = TRUE,
+ pillar.subtle_num = TRUE,
+ pillar.min_chars = Inf
+ )
>
> test_check("statsExpressions")
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
Adding missing grouping variables: `am`
t is large; approximation invoked.
Multiple `BFBayesFactor` models detected - posteriors are extracted from the first numerator model.
See help("get_parameters", package = "insight").
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
══ Skipped tests ═══════════════════════════════════════════════════════════════
• On CRAN (44)
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test-centrality_description.R:8:5): contingency_table works ──────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `mutate(., expression = glue("widehat(mu)[{centrality}]=='{format_value(estimate, k)}'"),
n_label = paste0({
{
x
}
}, "\n(n = ", .prettyNum(n), ")"))`: Problem while computing `n_label = paste0(Species, "\n(n = ", .prettyNum(n), ")")`.
Caused by error in `vapply()`:
! values must be length 1,
but FUN(X[[1]]) result is length 3
Backtrace:
▆
1. ├─purrr::pmap_dfr(...) at test-centrality_description.R:8:4
2. │ └─purrr::pmap(.l, .f, ...)
3. │ └─statsExpressions .f(...)
4. │ └─... %>% ...
5. ├─dplyr::select(...)
6. ├─dplyr::arrange(...)
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
10. │ ├─base::withCallingHandlers(...)
11. │ └─mask$eval_all_mutate(quo)
12. ├─base::paste0(Species, "\n(n = ", .prettyNum(n), ")")
13. ├─statsExpressions:::.prettyNum(n)
14. │ └─base::prettyNum(x, big.mark = ",", scientific = FALSE)
15. │ └─base::vapply(...)
16. └─base::.handleSimpleError(...)
17. └─dplyr h(simpleError(msg, call))
18. └─rlang::abort(...)
[ FAIL 1 | WARN 0 | SKIP 44 | PASS 39 ]
Error: Test failures
Execution halted
Flavor: r-release-windows-x86_64
Version: 1.3.1
Check: package dependencies
Result: NOTE
Package suggested but not available for checking: ‘testthat’
Flavor: r-oldrel-macos-x86_64
Version: 1.3.1
Check: re-building of vignette outputs
Result: WARN
Error(s) in re-building vignettes:
--- re-building 'statsExpressions.Rmd' using rmarkdown
Attaching package: 'dplyr'
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
Warning in (function (x, y = NULL, correct = TRUE, p = rep(1/length(x), :
Chi-squared approximation may be incorrect
--- finished re-building 'statsExpressions.Rmd'
--- re-building 'stats_details.Rmd' using rmarkdown
pandoc.exe: Could not fetch https://img.shields.io/badge/lifecycle-stable-brightgreen.svg
HttpExceptionRequest Request {
host = "img.shields.io"
port = 443
secure = True
requestHeaders = []
path = "/badge/lifecycle-stable-brightgreen.svg"
queryString = ""
method = "GET"
proxy = Nothing
rawBody = False
redirectCount = 10
responseTimeout = ResponseTimeoutDefault
requestVersion = HTTP/1.1
}
(ConnectionFailure getAddrInfo: does not exist (error 11001))
Error: processing vignette 'stats_details.Rmd' failed with diagnostics:
pandoc document conversion failed with error 67
--- failed re-building 'stats_details.Rmd'
SUMMARY: processing the following file failed:
'stats_details.Rmd'
Error: Vignette re-building failed.
Execution halted
Flavor: r-oldrel-windows-ix86+x86_64