Last updated on 2024-10-03 07:50:07 CEST.
Flavor | Version | Tinstall | Tcheck | Ttotal | Status | Flags |
---|---|---|---|---|---|---|
r-devel-linux-x86_64-debian-clang | 0.4.0 | 6.14 | 119.47 | 125.61 | OK | |
r-devel-linux-x86_64-debian-gcc | 0.4.0 | 4.54 | 50.68 | 55.22 | ERROR | |
r-devel-linux-x86_64-fedora-clang | 0.4.0 | 130.20 | ERROR | |||
r-devel-linux-x86_64-fedora-gcc | 0.4.0 | 135.79 | ERROR | |||
r-devel-windows-x86_64 | 0.4.0 | 7.00 | 85.00 | 92.00 | ERROR | |
r-patched-linux-x86_64 | 0.4.0 | 6.29 | 67.59 | 73.88 | ERROR | |
r-release-linux-x86_64 | 0.4.0 | 5.70 | 67.61 | 73.31 | ERROR | |
r-release-macos-arm64 | 0.4.0 | 55.00 | OK | |||
r-release-macos-x86_64 | 0.4.0 | 165.00 | OK | |||
r-release-windows-x86_64 | 0.4.0 | 8.00 | 118.00 | 126.00 | OK | |
r-oldrel-macos-arm64 | 0.4.0 | 63.00 | OK | |||
r-oldrel-macos-x86_64 | 0.4.0 | 149.00 | OK | |||
r-oldrel-windows-x86_64 | 0.4.0 | 9.00 | 100.00 | 109.00 | ERROR |
Version: 0.4.0
Check: examples
Result: ERROR
Running examples in ‘gtreg-Ex.R’ failed
The error most likely occurred in:
> base::assign(".ptime", proc.time(), pos = "CheckExEnv")
> ### Name: tbl_reg_summary
> ### Title: Data Summary Table
> ### Aliases: tbl_reg_summary
>
> ### ** Examples
>
> tbl_reg_summary_ex1 <-
+ df_patient_characteristics %>%
+ tbl_reg_summary(by = trt, include = c(marker, status))
Error in `dplyr::mutate()`:
ℹ In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─df_patient_characteristics %>% ...
2. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
3. │ ├─... %>% ...
4. │ ├─gtsummary::with_gtsummary_theme(...)
5. │ │ └─rlang::eval_tidy(...)
6. │ └─gtsummary::tbl_summary(...)
7. │ ├─base::structure(...)
8. │ ├─base::append(...)
9. │ └─gtsummary::brdg_summary(...)
10. │ ├─dplyr::left_join(...)
11. │ ├─dplyr:::left_join.data.frame(...)
12. │ │ └─dplyr::auto_copy(x, y, copy = copy)
13. │ │ ├─dplyr::same_src(x, y)
14. │ │ └─dplyr:::same_src.data.frame(x, y)
15. │ │ └─base::is.data.frame(y)
16. │ ├─dplyr::bind_rows(...)
17. │ │ └─rlang::list2(...)
18. │ └─gtsummary::pier_summary_continuous2(...)
19. │ ├─... %>% ...
20. │ ├─dplyr::bind_rows(...)
21. │ │ └─rlang::list2(...)
22. │ ├─dplyr::group_map(...)
23. │ └─dplyr:::group_map.data.frame(...)
24. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
25. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
26. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
27. │ ├─dplyr::mutate(...)
28. │ └─dplyr:::mutate.data.frame(...)
29. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
30. │ ├─base::withCallingHandlers(...)
31. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
32. │ └─mask$eval_all_mutate(quo)
33. │ └─dplyr (local) eval()
34. ├─base::structure(...)
35. ├─dplyr::left_join(...)
36. ├─dplyr:::left_join.data.frame(...)
37. │ └─dplyr::auto_copy(x, y, copy = copy)
38. │ ├─dplyr::same_src(x, y)
39. │ └─dplyr:::same_src.data.frame(x, y)
40. │ └─base::is.data.frame(y)
41. ├─gtsummary:::map(...)
42. │ └─base::lapply(.x, .f, ...)
43. │ └─gtsummary (local) FUN(X[[i]], ...)
44. │ └─glue::glue(...)
45. │ └─glue::glue_data(...)
46. │ └─base::stopifnot(is.environment(.envir))
47. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
48. └─dplyr (local) `<fn>`(`<smplErrr>`)
49. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
Execution halted
Flavors: r-devel-linux-x86_64-debian-gcc, r-patched-linux-x86_64, r-release-linux-x86_64
Version: 0.4.0
Check: tests
Result: ERROR
Running ‘spelling.R’ [0s/0s]
Running ‘testthat.R’ [17s/21s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(gtreg)
Attaching package: 'gtreg'
The following object is masked from 'package:testthat':
matches
>
> test_check("gtreg")
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
══ Skipped tests (4) ═══════════════════════════════════════════════════════════
• On CRAN (4): 'test-add_overall.R:1:1', 'test-tbl_ae.R:1:1',
'test-tbl_ae_count.R:1:1', 'test-tbl_ae_focus.R:1:1'
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-inline_text.R:2:3'): inline text works ─────────────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = df_groups_and_variable, df_stats = list(dplyr::bind_rows(dplyr::group_map(dplyr::group_by(dplyr::filter(df_variable_stats,
!.data$variable_level %in% list(NULL)), .data$variable_level),
function(df_variable_level_stats, df_variable_levels) {
dplyr::mutate(.data = df_variable_levels, stat = map(str_statistic_pre_glue,
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue,
.envir = c(cards::get_ard_statistics(df_variable_level_stats,
.column = "stat_fmt"), lst_variable_stats)))
}), label = map_chr(.data$variable_level, as.character))
}))))`: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
── Error ('test-modify_header.R:2:3'): modify_header() works ───────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(., tbl = switch(.parent_fun, tbl_strata = map(.data$data,
.tbl_fun, ...), tbl_strata2 = map2(.data$data, .data$header,
.tbl_fun, ...)))`: i In argument: `tbl = switch(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─... %>% ... at test-modify_header.R:2:3
2. ├─gtreg::tbl_ae(...)
3. │ └─gtreg:::.construct_summary_table(...)
4. │ └─gtsummary::tbl_strata(...)
5. │ └─gtsummary:::tbl_strata_internal(...)
6. │ └─... %>% ...
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
10. │ ├─base::withCallingHandlers(...)
11. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
12. │ └─mask$eval_all_mutate(quo)
13. │ └─dplyr (local) eval()
14. ├─gtsummary:::map(.data$data, .tbl_fun, ...)
15. │ └─base::lapply(.x, .f, ...)
16. │ └─gtreg (local) FUN(X[[i]], ...)
17. │ └─gtreg (local) .final_summary_fun(data = .x)
18. │ └─gtreg:::.build_single_summary_table(...)
19. │ ├─... %>% gtsummary::tbl_butcher()
20. │ └─gtsummary::tbl_summary(...)
21. │ ├─base::structure(...)
22. │ ├─base::append(...)
23. │ └─gtsummary::brdg_summary(...)
24. │ ├─dplyr::left_join(...)
25. │ ├─dplyr:::left_join.data.frame(...)
26. │ │ └─dplyr::auto_copy(x, y, copy = copy)
27. │ │ ├─dplyr::same_src(x, y)
28. │ │ └─dplyr:::same_src.data.frame(x, y)
29. │ │ └─base::is.data.frame(y)
30. │ ├─dplyr::bind_rows(...)
31. │ │ └─rlang::list2(...)
32. │ └─gtsummary::pier_summary_categorical(...)
33. │ ├─... %>% ...
34. │ ├─dplyr::bind_rows(...)
35. │ │ └─rlang::list2(...)
36. │ ├─dplyr::group_map(...)
37. │ └─dplyr:::group_map.data.frame(...)
38. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
39. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
40. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
41. │ ├─dplyr::mutate(...)
42. │ └─dplyr:::mutate.data.frame(...)
43. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
44. │ ├─base::withCallingHandlers(...)
45. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
46. │ └─mask$eval_all_mutate(quo)
47. │ └─dplyr (local) eval()
48. ├─gtsummary::tbl_butcher(.)
49. │ └─gtsummary:::check_class(x, "gtsummary")
50. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
51. │ └─dplyr::filter(...)
52. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
53. │ ├─base::unique(...)
54. │ ├─dplyr::pull(...)
55. │ └─dplyr::filter(...)
56. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
57. ├─gtreg:::.add_modify_stat_data(.)
58. │ └─tbl$table_styling$header %>% ...
59. ├─dplyr::mutate(...)
60. ├─gtsummary::modify_header(...)
61. ├─gtsummary::remove_row_type(., type = "header")
62. ├─dplyr::left_join(...)
63. ├─dplyr:::left_join.data.frame(...)
64. │ └─dplyr::auto_copy(x, y, copy = copy)
65. │ ├─dplyr::same_src(x, y)
66. │ └─dplyr:::same_src.data.frame(x, y)
67. │ └─base::is.data.frame(y)
68. ├─dplyr::bind_rows(...)
69. │ └─rlang::list2(...)
70. ├─dplyr::group_map(...)
71. ├─dplyr:::group_map.data.frame(...)
72. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
73. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
74. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
75. │ ├─dplyr::mutate(...)
76. │ └─dplyr:::mutate.data.frame(...)
77. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
78. │ ├─base::withCallingHandlers(...)
79. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
80. │ └─mask$eval_all_mutate(quo)
81. │ └─dplyr (local) eval()
82. ├─gtsummary:::map(...)
83. │ └─base::lapply(.x, .f, ...)
84. │ └─gtsummary (local) FUN(X[[i]], ...)
85. │ └─glue::glue(...)
86. │ └─glue::glue_data(...)
87. │ └─base::stopifnot(is.environment(.envir))
88. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
89. ├─dplyr (local) `<fn>`(`<smplErrr>`)
90. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
91. │ └─rlang:::signal_abort(cnd, .file)
92. │ └─base::signalCondition(cnd)
93. ├─dplyr (local) `<fn>`(`<dply:::_>`)
94. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
95. │ └─rlang:::signal_abort(cnd, .file)
96. │ └─base::signalCondition(cnd)
97. └─dplyr (local) `<fn>`(`<dply:::_>`)
98. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:22:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:38:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:52:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In index: 1.
i With name: any_complication.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: purrr_error_indexed/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:52:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_spanning_header(all_ae_cols() ~ "**N = xx**")
8. ├─gtsummary::modify_spanning_header(., all_ae_cols() ~ "**N = xx**")
9. ├─gtreg::tbl_ae_focus(...)
10. │ └─... %>% gtsummary::tbl_merge(tab_spanner = FALSE)
11. ├─gtsummary::tbl_merge(., tab_spanner = FALSE)
12. ├─purrr::imap(...)
13. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
14. │ └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
15. │ ├─purrr:::with_indexed_errors(...)
16. │ │ └─base::withCallingHandlers(...)
17. │ ├─purrr:::call_with_cleanup(...)
18. │ └─gtreg (local) .f(.x[[i]], .y[[i]], ...)
19. │ └─gtreg:::.construct_summary_table(...)
20. │ └─gtreg (local) .final_summary_fun(data)
21. │ └─gtreg:::.build_single_summary_table(...)
22. │ ├─... %>% gtsummary::tbl_butcher()
23. │ └─gtsummary::tbl_summary(...)
24. │ ├─base::structure(...)
25. │ ├─base::append(...)
26. │ └─gtsummary::brdg_summary(...)
27. │ ├─dplyr::left_join(...)
28. │ ├─dplyr:::left_join.data.frame(...)
29. │ │ └─dplyr::auto_copy(x, y, copy = copy)
30. │ │ ├─dplyr::same_src(x, y)
31. │ │ └─dplyr:::same_src.data.frame(x, y)
32. │ │ └─base::is.data.frame(y)
33. │ ├─dplyr::bind_rows(...)
34. │ │ └─rlang::list2(...)
35. │ └─gtsummary::pier_summary_categorical(...)
36. │ ├─... %>% ...
37. │ ├─dplyr::bind_rows(...)
38. │ │ └─rlang::list2(...)
39. │ ├─dplyr::group_map(...)
40. │ └─dplyr:::group_map.data.frame(...)
41. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
42. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
43. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
44. │ ├─dplyr::mutate(...)
45. │ └─dplyr:::mutate.data.frame(...)
46. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
47. │ ├─base::withCallingHandlers(...)
48. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
49. │ └─mask$eval_all_mutate(quo)
50. │ └─dplyr (local) eval()
51. ├─gtsummary::tbl_butcher(.)
52. │ └─gtsummary:::check_class(x, "gtsummary")
53. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
54. │ └─dplyr::filter(...)
55. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
56. │ ├─base::unique(...)
57. │ ├─dplyr::pull(...)
58. │ └─dplyr::filter(...)
59. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
60. ├─gtreg:::.add_modify_stat_data(.)
61. │ └─tbl$table_styling$header %>% ...
62. ├─dplyr::mutate(...)
63. ├─gtsummary::modify_header(...)
64. ├─gtsummary::remove_row_type(., type = "header")
65. ├─dplyr::left_join(...)
66. ├─dplyr:::left_join.data.frame(...)
67. │ └─dplyr::auto_copy(x, y, copy = copy)
68. │ ├─dplyr::same_src(x, y)
69. │ └─dplyr:::same_src.data.frame(x, y)
70. │ └─base::is.data.frame(y)
71. ├─dplyr::bind_rows(...)
72. │ └─rlang::list2(...)
73. ├─dplyr::group_map(...)
74. ├─dplyr:::group_map.data.frame(...)
75. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
76. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
77. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
78. │ ├─dplyr::mutate(...)
79. │ └─dplyr:::mutate.data.frame(...)
80. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
81. │ ├─base::withCallingHandlers(...)
82. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
83. │ └─mask$eval_all_mutate(quo)
84. │ └─dplyr (local) eval()
85. ├─gtsummary:::map(...)
86. │ └─base::lapply(.x, .f, ...)
87. │ └─gtsummary (local) FUN(X[[i]], ...)
88. │ └─glue::glue(...)
89. │ └─glue::glue_data(...)
90. │ └─base::stopifnot(is.environment(.envir))
91. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
92. ├─dplyr (local) `<fn>`(`<smplErrr>`)
93. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
94. │ └─rlang:::signal_abort(cnd, .file)
95. │ └─base::signalCondition(cnd)
96. ├─dplyr (local) `<fn>`(`<dply:::_>`)
97. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
98. │ └─rlang:::signal_abort(cnd, .file)
99. │ └─base::signalCondition(cnd)
100. └─purrr (local) `<fn>`(`<dply:::_>`)
101. └─cli::cli_abort(...)
102. └─rlang::abort(...)
── Error ('test-style_xxx.R:67:3'): style_xxx works with tbl_ae family ─────────
Error: object 't1' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t1)) at test-style_xxx.R:67:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-style_xxx.R:76:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:76:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:90:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:90:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-style_xxx.R:110:3'): style_xxx works with tbl_reg_summary ──────
Error: object 't4' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t4)) at test-style_xxx.R:110:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-tbl_reg_summary.R:2:3'): tbl_reg_summary works ───────────────
``%>%`(...)` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-tbl_reg_summary.R:2:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-tbl_reg_summary.R:9:3'): tbl_reg_summary works ─────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = .y, stat = list(map(statistic[[.y$variable[1]]],
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_fmt")))
})), label = list(map(statistic[[.y$variable[1]]], function(str_to_glue) {
label <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_label")))
})))`: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─testthat::expect_message(...) at test-tbl_reg_summary.R:9:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-debian-gcc
Version: 0.4.0
Check: examples
Result: ERROR
Running examples in ‘gtreg-Ex.R’ failed
The error most likely occurred in:
> ### Name: tbl_reg_summary
> ### Title: Data Summary Table
> ### Aliases: tbl_reg_summary
>
> ### ** Examples
>
> tbl_reg_summary_ex1 <-
+ df_patient_characteristics %>%
+ tbl_reg_summary(by = trt, include = c(marker, status))
Error in `dplyr::mutate()`:
ℹ In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─df_patient_characteristics %>% ...
2. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
3. │ ├─... %>% ...
4. │ ├─gtsummary::with_gtsummary_theme(...)
5. │ │ └─rlang::eval_tidy(...)
6. │ └─gtsummary::tbl_summary(...)
7. │ ├─base::structure(...)
8. │ ├─base::append(...)
9. │ └─gtsummary::brdg_summary(...)
10. │ ├─dplyr::left_join(...)
11. │ ├─dplyr:::left_join.data.frame(...)
12. │ │ └─dplyr::auto_copy(x, y, copy = copy)
13. │ │ ├─dplyr::same_src(x, y)
14. │ │ └─dplyr:::same_src.data.frame(x, y)
15. │ │ └─base::is.data.frame(y)
16. │ ├─dplyr::bind_rows(...)
17. │ │ └─rlang::list2(...)
18. │ └─gtsummary::pier_summary_continuous2(...)
19. │ ├─... %>% ...
20. │ ├─dplyr::bind_rows(...)
21. │ │ └─rlang::list2(...)
22. │ ├─dplyr::group_map(...)
23. │ └─dplyr:::group_map.data.frame(...)
24. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
25. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
26. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
27. │ ├─dplyr::mutate(...)
28. │ └─dplyr:::mutate.data.frame(...)
29. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
30. │ ├─base::withCallingHandlers(...)
31. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
32. │ └─mask$eval_all_mutate(quo)
33. │ └─dplyr (local) eval()
34. ├─base::structure(...)
35. ├─dplyr::left_join(...)
36. ├─dplyr:::left_join.data.frame(...)
37. │ └─dplyr::auto_copy(x, y, copy = copy)
38. │ ├─dplyr::same_src(x, y)
39. │ └─dplyr:::same_src.data.frame(x, y)
40. │ └─base::is.data.frame(y)
41. ├─gtsummary:::map(...)
42. │ └─base::lapply(.x, .f, ...)
43. │ └─gtsummary (local) FUN(X[[i]], ...)
44. │ └─glue::glue(...)
45. │ └─glue::glue_data(...)
46. │ └─base::stopifnot(is.environment(.envir))
47. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
48. └─dplyr (local) `<fn>`(`<smplErrr>`)
49. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
Execution halted
Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc, r-devel-windows-x86_64, r-oldrel-windows-x86_64
Version: 0.4.0
Check: tests
Result: ERROR
Running ‘spelling.R’
Running ‘testthat.R’ [43s/52s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(gtreg)
Attaching package: 'gtreg'
The following object is masked from 'package:testthat':
matches
>
> test_check("gtreg")
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
══ Skipped tests (4) ═══════════════════════════════════════════════════════════
• On CRAN (4): 'test-add_overall.R:1:1', 'test-tbl_ae.R:1:1',
'test-tbl_ae_count.R:1:1', 'test-tbl_ae_focus.R:1:1'
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-inline_text.R:2:3'): inline text works ─────────────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = df_groups_and_variable, df_stats = list(dplyr::bind_rows(dplyr::group_map(dplyr::group_by(dplyr::filter(df_variable_stats,
!.data$variable_level %in% list(NULL)), .data$variable_level),
function(df_variable_level_stats, df_variable_levels) {
dplyr::mutate(.data = df_variable_levels, stat = map(str_statistic_pre_glue,
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue,
.envir = c(cards::get_ard_statistics(df_variable_level_stats,
.column = "stat_fmt"), lst_variable_stats)))
}), label = map_chr(.data$variable_level, as.character))
}))))`: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
── Error ('test-modify_header.R:2:3'): modify_header() works ───────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(., tbl = switch(.parent_fun, tbl_strata = map(.data$data,
.tbl_fun, ...), tbl_strata2 = map2(.data$data, .data$header,
.tbl_fun, ...)))`: i In argument: `tbl = switch(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─... %>% ... at test-modify_header.R:2:3
2. ├─gtreg::tbl_ae(...)
3. │ └─gtreg:::.construct_summary_table(...)
4. │ └─gtsummary::tbl_strata(...)
5. │ └─gtsummary:::tbl_strata_internal(...)
6. │ └─... %>% ...
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
10. │ ├─base::withCallingHandlers(...)
11. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
12. │ └─mask$eval_all_mutate(quo)
13. │ └─dplyr (local) eval()
14. ├─gtsummary:::map(.data$data, .tbl_fun, ...)
15. │ └─base::lapply(.x, .f, ...)
16. │ └─gtreg (local) FUN(X[[i]], ...)
17. │ └─gtreg (local) .final_summary_fun(data = .x)
18. │ └─gtreg:::.build_single_summary_table(...)
19. │ ├─... %>% gtsummary::tbl_butcher()
20. │ └─gtsummary::tbl_summary(...)
21. │ ├─base::structure(...)
22. │ ├─base::append(...)
23. │ └─gtsummary::brdg_summary(...)
24. │ ├─dplyr::left_join(...)
25. │ ├─dplyr:::left_join.data.frame(...)
26. │ │ └─dplyr::auto_copy(x, y, copy = copy)
27. │ │ ├─dplyr::same_src(x, y)
28. │ │ └─dplyr:::same_src.data.frame(x, y)
29. │ │ └─base::is.data.frame(y)
30. │ ├─dplyr::bind_rows(...)
31. │ │ └─rlang::list2(...)
32. │ └─gtsummary::pier_summary_categorical(...)
33. │ ├─... %>% ...
34. │ ├─dplyr::bind_rows(...)
35. │ │ └─rlang::list2(...)
36. │ ├─dplyr::group_map(...)
37. │ └─dplyr:::group_map.data.frame(...)
38. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
39. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
40. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
41. │ ├─dplyr::mutate(...)
42. │ └─dplyr:::mutate.data.frame(...)
43. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
44. │ ├─base::withCallingHandlers(...)
45. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
46. │ └─mask$eval_all_mutate(quo)
47. │ └─dplyr (local) eval()
48. ├─gtsummary::tbl_butcher(.)
49. │ └─gtsummary:::check_class(x, "gtsummary")
50. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
51. │ └─dplyr::filter(...)
52. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
53. │ ├─base::unique(...)
54. │ ├─dplyr::pull(...)
55. │ └─dplyr::filter(...)
56. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
57. ├─gtreg:::.add_modify_stat_data(.)
58. │ └─tbl$table_styling$header %>% ...
59. ├─dplyr::mutate(...)
60. ├─gtsummary::modify_header(...)
61. ├─gtsummary::remove_row_type(., type = "header")
62. ├─dplyr::left_join(...)
63. ├─dplyr:::left_join.data.frame(...)
64. │ └─dplyr::auto_copy(x, y, copy = copy)
65. │ ├─dplyr::same_src(x, y)
66. │ └─dplyr:::same_src.data.frame(x, y)
67. │ └─base::is.data.frame(y)
68. ├─dplyr::bind_rows(...)
69. │ └─rlang::list2(...)
70. ├─dplyr::group_map(...)
71. ├─dplyr:::group_map.data.frame(...)
72. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
73. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
74. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
75. │ ├─dplyr::mutate(...)
76. │ └─dplyr:::mutate.data.frame(...)
77. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
78. │ ├─base::withCallingHandlers(...)
79. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
80. │ └─mask$eval_all_mutate(quo)
81. │ └─dplyr (local) eval()
82. ├─gtsummary:::map(...)
83. │ └─base::lapply(.x, .f, ...)
84. │ └─gtsummary (local) FUN(X[[i]], ...)
85. │ └─glue::glue(...)
86. │ └─glue::glue_data(...)
87. │ └─base::stopifnot(is.environment(.envir))
88. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
89. ├─dplyr (local) `<fn>`(`<smplErrr>`)
90. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
91. │ └─rlang:::signal_abort(cnd, .file)
92. │ └─base::signalCondition(cnd)
93. ├─dplyr (local) `<fn>`(`<dply:::_>`)
94. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
95. │ └─rlang:::signal_abort(cnd, .file)
96. │ └─base::signalCondition(cnd)
97. └─dplyr (local) `<fn>`(`<dply:::_>`)
98. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:22:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:38:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:52:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In index: 1.
i With name: any_complication.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: purrr_error_indexed/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:52:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_spanning_header(all_ae_cols() ~ "**N = xx**")
8. ├─gtsummary::modify_spanning_header(., all_ae_cols() ~ "**N = xx**")
9. ├─gtreg::tbl_ae_focus(...)
10. │ └─... %>% gtsummary::tbl_merge(tab_spanner = FALSE)
11. ├─gtsummary::tbl_merge(., tab_spanner = FALSE)
12. ├─purrr::imap(...)
13. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
14. │ └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
15. │ ├─purrr:::with_indexed_errors(...)
16. │ │ └─base::withCallingHandlers(...)
17. │ ├─purrr:::call_with_cleanup(...)
18. │ └─gtreg (local) .f(.x[[i]], .y[[i]], ...)
19. │ └─gtreg:::.construct_summary_table(...)
20. │ └─gtreg (local) .final_summary_fun(data)
21. │ └─gtreg:::.build_single_summary_table(...)
22. │ ├─... %>% gtsummary::tbl_butcher()
23. │ └─gtsummary::tbl_summary(...)
24. │ ├─base::structure(...)
25. │ ├─base::append(...)
26. │ └─gtsummary::brdg_summary(...)
27. │ ├─dplyr::left_join(...)
28. │ ├─dplyr:::left_join.data.frame(...)
29. │ │ └─dplyr::auto_copy(x, y, copy = copy)
30. │ │ ├─dplyr::same_src(x, y)
31. │ │ └─dplyr:::same_src.data.frame(x, y)
32. │ │ └─base::is.data.frame(y)
33. │ ├─dplyr::bind_rows(...)
34. │ │ └─rlang::list2(...)
35. │ └─gtsummary::pier_summary_categorical(...)
36. │ ├─... %>% ...
37. │ ├─dplyr::bind_rows(...)
38. │ │ └─rlang::list2(...)
39. │ ├─dplyr::group_map(...)
40. │ └─dplyr:::group_map.data.frame(...)
41. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
42. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
43. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
44. │ ├─dplyr::mutate(...)
45. │ └─dplyr:::mutate.data.frame(...)
46. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
47. │ ├─base::withCallingHandlers(...)
48. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
49. │ └─mask$eval_all_mutate(quo)
50. │ └─dplyr (local) eval()
51. ├─gtsummary::tbl_butcher(.)
52. │ └─gtsummary:::check_class(x, "gtsummary")
53. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
54. │ └─dplyr::filter(...)
55. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
56. │ ├─base::unique(...)
57. │ ├─dplyr::pull(...)
58. │ └─dplyr::filter(...)
59. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
60. ├─gtreg:::.add_modify_stat_data(.)
61. │ └─tbl$table_styling$header %>% ...
62. ├─dplyr::mutate(...)
63. ├─gtsummary::modify_header(...)
64. ├─gtsummary::remove_row_type(., type = "header")
65. ├─dplyr::left_join(...)
66. ├─dplyr:::left_join.data.frame(...)
67. │ └─dplyr::auto_copy(x, y, copy = copy)
68. │ ├─dplyr::same_src(x, y)
69. │ └─dplyr:::same_src.data.frame(x, y)
70. │ └─base::is.data.frame(y)
71. ├─dplyr::bind_rows(...)
72. │ └─rlang::list2(...)
73. ├─dplyr::group_map(...)
74. ├─dplyr:::group_map.data.frame(...)
75. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
76. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
77. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
78. │ ├─dplyr::mutate(...)
79. │ └─dplyr:::mutate.data.frame(...)
80. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
81. │ ├─base::withCallingHandlers(...)
82. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
83. │ └─mask$eval_all_mutate(quo)
84. │ └─dplyr (local) eval()
85. ├─gtsummary:::map(...)
86. │ └─base::lapply(.x, .f, ...)
87. │ └─gtsummary (local) FUN(X[[i]], ...)
88. │ └─glue::glue(...)
89. │ └─glue::glue_data(...)
90. │ └─base::stopifnot(is.environment(.envir))
91. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
92. ├─dplyr (local) `<fn>`(`<smplErrr>`)
93. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
94. │ └─rlang:::signal_abort(cnd, .file)
95. │ └─base::signalCondition(cnd)
96. ├─dplyr (local) `<fn>`(`<dply:::_>`)
97. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
98. │ └─rlang:::signal_abort(cnd, .file)
99. │ └─base::signalCondition(cnd)
100. └─purrr (local) `<fn>`(`<dply:::_>`)
101. └─cli::cli_abort(...)
102. └─rlang::abort(...)
── Error ('test-style_xxx.R:67:3'): style_xxx works with tbl_ae family ─────────
Error: object 't1' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t1)) at test-style_xxx.R:67:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-style_xxx.R:76:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:76:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:90:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:90:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-style_xxx.R:110:3'): style_xxx works with tbl_reg_summary ──────
Error: object 't4' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t4)) at test-style_xxx.R:110:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-tbl_reg_summary.R:2:3'): tbl_reg_summary works ───────────────
``%>%`(...)` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-tbl_reg_summary.R:2:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-tbl_reg_summary.R:9:3'): tbl_reg_summary works ─────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = .y, stat = list(map(statistic[[.y$variable[1]]],
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_fmt")))
})), label = list(map(statistic[[.y$variable[1]]], function(str_to_glue) {
label <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_label")))
})))`: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─testthat::expect_message(...) at test-tbl_reg_summary.R:9:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-fedora-clang
Version: 0.4.0
Check: tests
Result: ERROR
Running ‘spelling.R’
Running ‘testthat.R’ [40s/92s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(gtreg)
Attaching package: 'gtreg'
The following object is masked from 'package:testthat':
matches
>
> test_check("gtreg")
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
══ Skipped tests (4) ═══════════════════════════════════════════════════════════
• On CRAN (4): 'test-add_overall.R:1:1', 'test-tbl_ae.R:1:1',
'test-tbl_ae_count.R:1:1', 'test-tbl_ae_focus.R:1:1'
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-inline_text.R:2:3'): inline text works ─────────────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = df_groups_and_variable, df_stats = list(dplyr::bind_rows(dplyr::group_map(dplyr::group_by(dplyr::filter(df_variable_stats,
!.data$variable_level %in% list(NULL)), .data$variable_level),
function(df_variable_level_stats, df_variable_levels) {
dplyr::mutate(.data = df_variable_levels, stat = map(str_statistic_pre_glue,
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue,
.envir = c(cards::get_ard_statistics(df_variable_level_stats,
.column = "stat_fmt"), lst_variable_stats)))
}), label = map_chr(.data$variable_level, as.character))
}))))`: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
── Error ('test-modify_header.R:2:3'): modify_header() works ───────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(., tbl = switch(.parent_fun, tbl_strata = map(.data$data,
.tbl_fun, ...), tbl_strata2 = map2(.data$data, .data$header,
.tbl_fun, ...)))`: i In argument: `tbl = switch(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─... %>% ... at test-modify_header.R:2:3
2. ├─gtreg::tbl_ae(...)
3. │ └─gtreg:::.construct_summary_table(...)
4. │ └─gtsummary::tbl_strata(...)
5. │ └─gtsummary:::tbl_strata_internal(...)
6. │ └─... %>% ...
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
10. │ ├─base::withCallingHandlers(...)
11. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
12. │ └─mask$eval_all_mutate(quo)
13. │ └─dplyr (local) eval()
14. ├─gtsummary:::map(.data$data, .tbl_fun, ...)
15. │ └─base::lapply(.x, .f, ...)
16. │ └─gtreg (local) FUN(X[[i]], ...)
17. │ └─gtreg (local) .final_summary_fun(data = .x)
18. │ └─gtreg:::.build_single_summary_table(...)
19. │ ├─... %>% gtsummary::tbl_butcher()
20. │ └─gtsummary::tbl_summary(...)
21. │ ├─base::structure(...)
22. │ ├─base::append(...)
23. │ └─gtsummary::brdg_summary(...)
24. │ ├─dplyr::left_join(...)
25. │ ├─dplyr:::left_join.data.frame(...)
26. │ │ └─dplyr::auto_copy(x, y, copy = copy)
27. │ │ ├─dplyr::same_src(x, y)
28. │ │ └─dplyr:::same_src.data.frame(x, y)
29. │ │ └─base::is.data.frame(y)
30. │ ├─dplyr::bind_rows(...)
31. │ │ └─rlang::list2(...)
32. │ └─gtsummary::pier_summary_categorical(...)
33. │ ├─... %>% ...
34. │ ├─dplyr::bind_rows(...)
35. │ │ └─rlang::list2(...)
36. │ ├─dplyr::group_map(...)
37. │ └─dplyr:::group_map.data.frame(...)
38. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
39. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
40. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
41. │ ├─dplyr::mutate(...)
42. │ └─dplyr:::mutate.data.frame(...)
43. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
44. │ ├─base::withCallingHandlers(...)
45. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
46. │ └─mask$eval_all_mutate(quo)
47. │ └─dplyr (local) eval()
48. ├─gtsummary::tbl_butcher(.)
49. │ └─gtsummary:::check_class(x, "gtsummary")
50. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
51. │ └─dplyr::filter(...)
52. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
53. │ ├─base::unique(...)
54. │ ├─dplyr::pull(...)
55. │ └─dplyr::filter(...)
56. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
57. ├─gtreg:::.add_modify_stat_data(.)
58. │ └─tbl$table_styling$header %>% ...
59. ├─dplyr::mutate(...)
60. ├─gtsummary::modify_header(...)
61. ├─gtsummary::remove_row_type(., type = "header")
62. ├─dplyr::left_join(...)
63. ├─dplyr:::left_join.data.frame(...)
64. │ └─dplyr::auto_copy(x, y, copy = copy)
65. │ ├─dplyr::same_src(x, y)
66. │ └─dplyr:::same_src.data.frame(x, y)
67. │ └─base::is.data.frame(y)
68. ├─dplyr::bind_rows(...)
69. │ └─rlang::list2(...)
70. ├─dplyr::group_map(...)
71. ├─dplyr:::group_map.data.frame(...)
72. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
73. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
74. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
75. │ ├─dplyr::mutate(...)
76. │ └─dplyr:::mutate.data.frame(...)
77. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
78. │ ├─base::withCallingHandlers(...)
79. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
80. │ └─mask$eval_all_mutate(quo)
81. │ └─dplyr (local) eval()
82. ├─gtsummary:::map(...)
83. │ └─base::lapply(.x, .f, ...)
84. │ └─gtsummary (local) FUN(X[[i]], ...)
85. │ └─glue::glue(...)
86. │ └─glue::glue_data(...)
87. │ └─base::stopifnot(is.environment(.envir))
88. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
89. ├─dplyr (local) `<fn>`(`<smplErrr>`)
90. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
91. │ └─rlang:::signal_abort(cnd, .file)
92. │ └─base::signalCondition(cnd)
93. ├─dplyr (local) `<fn>`(`<dply:::_>`)
94. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
95. │ └─rlang:::signal_abort(cnd, .file)
96. │ └─base::signalCondition(cnd)
97. └─dplyr (local) `<fn>`(`<dply:::_>`)
98. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:22:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:38:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:52:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In index: 1.
i With name: any_complication.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: purrr_error_indexed/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:52:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_spanning_header(all_ae_cols() ~ "**N = xx**")
8. ├─gtsummary::modify_spanning_header(., all_ae_cols() ~ "**N = xx**")
9. ├─gtreg::tbl_ae_focus(...)
10. │ └─... %>% gtsummary::tbl_merge(tab_spanner = FALSE)
11. ├─gtsummary::tbl_merge(., tab_spanner = FALSE)
12. ├─purrr::imap(...)
13. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
14. │ └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
15. │ ├─purrr:::with_indexed_errors(...)
16. │ │ └─base::withCallingHandlers(...)
17. │ ├─purrr:::call_with_cleanup(...)
18. │ └─gtreg (local) .f(.x[[i]], .y[[i]], ...)
19. │ └─gtreg:::.construct_summary_table(...)
20. │ └─gtreg (local) .final_summary_fun(data)
21. │ └─gtreg:::.build_single_summary_table(...)
22. │ ├─... %>% gtsummary::tbl_butcher()
23. │ └─gtsummary::tbl_summary(...)
24. │ ├─base::structure(...)
25. │ ├─base::append(...)
26. │ └─gtsummary::brdg_summary(...)
27. │ ├─dplyr::left_join(...)
28. │ ├─dplyr:::left_join.data.frame(...)
29. │ │ └─dplyr::auto_copy(x, y, copy = copy)
30. │ │ ├─dplyr::same_src(x, y)
31. │ │ └─dplyr:::same_src.data.frame(x, y)
32. │ │ └─base::is.data.frame(y)
33. │ ├─dplyr::bind_rows(...)
34. │ │ └─rlang::list2(...)
35. │ └─gtsummary::pier_summary_categorical(...)
36. │ ├─... %>% ...
37. │ ├─dplyr::bind_rows(...)
38. │ │ └─rlang::list2(...)
39. │ ├─dplyr::group_map(...)
40. │ └─dplyr:::group_map.data.frame(...)
41. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
42. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
43. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
44. │ ├─dplyr::mutate(...)
45. │ └─dplyr:::mutate.data.frame(...)
46. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
47. │ ├─base::withCallingHandlers(...)
48. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
49. │ └─mask$eval_all_mutate(quo)
50. │ └─dplyr (local) eval()
51. ├─gtsummary::tbl_butcher(.)
52. │ └─gtsummary:::check_class(x, "gtsummary")
53. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
54. │ └─dplyr::filter(...)
55. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
56. │ ├─base::unique(...)
57. │ ├─dplyr::pull(...)
58. │ └─dplyr::filter(...)
59. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
60. ├─gtreg:::.add_modify_stat_data(.)
61. │ └─tbl$table_styling$header %>% ...
62. ├─dplyr::mutate(...)
63. ├─gtsummary::modify_header(...)
64. ├─gtsummary::remove_row_type(., type = "header")
65. ├─dplyr::left_join(...)
66. ├─dplyr:::left_join.data.frame(...)
67. │ └─dplyr::auto_copy(x, y, copy = copy)
68. │ ├─dplyr::same_src(x, y)
69. │ └─dplyr:::same_src.data.frame(x, y)
70. │ └─base::is.data.frame(y)
71. ├─dplyr::bind_rows(...)
72. │ └─rlang::list2(...)
73. ├─dplyr::group_map(...)
74. ├─dplyr:::group_map.data.frame(...)
75. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
76. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
77. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
78. │ ├─dplyr::mutate(...)
79. │ └─dplyr:::mutate.data.frame(...)
80. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
81. │ ├─base::withCallingHandlers(...)
82. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
83. │ └─mask$eval_all_mutate(quo)
84. │ └─dplyr (local) eval()
85. ├─gtsummary:::map(...)
86. │ └─base::lapply(.x, .f, ...)
87. │ └─gtsummary (local) FUN(X[[i]], ...)
88. │ └─glue::glue(...)
89. │ └─glue::glue_data(...)
90. │ └─base::stopifnot(is.environment(.envir))
91. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
92. ├─dplyr (local) `<fn>`(`<smplErrr>`)
93. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
94. │ └─rlang:::signal_abort(cnd, .file)
95. │ └─base::signalCondition(cnd)
96. ├─dplyr (local) `<fn>`(`<dply:::_>`)
97. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
98. │ └─rlang:::signal_abort(cnd, .file)
99. │ └─base::signalCondition(cnd)
100. └─purrr (local) `<fn>`(`<dply:::_>`)
101. └─cli::cli_abort(...)
102. └─rlang::abort(...)
── Error ('test-style_xxx.R:67:3'): style_xxx works with tbl_ae family ─────────
Error: object 't1' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t1)) at test-style_xxx.R:67:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-style_xxx.R:76:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:76:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:90:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:90:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-style_xxx.R:110:3'): style_xxx works with tbl_reg_summary ──────
Error: object 't4' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t4)) at test-style_xxx.R:110:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-tbl_reg_summary.R:2:3'): tbl_reg_summary works ───────────────
``%>%`(...)` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-tbl_reg_summary.R:2:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-tbl_reg_summary.R:9:3'): tbl_reg_summary works ─────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = .y, stat = list(map(statistic[[.y$variable[1]]],
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_fmt")))
})), label = list(map(statistic[[.y$variable[1]]], function(str_to_glue) {
label <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_label")))
})))`: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─testthat::expect_message(...) at test-tbl_reg_summary.R:9:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc
Version: 0.4.0
Check: tests
Result: ERROR
Running 'spelling.R' [0s]
Running 'testthat.R' [19s]
Running the tests in 'tests/testthat.R' failed.
Complete output:
> library(testthat)
> library(gtreg)
Attaching package: 'gtreg'
The following object is masked from 'package:testthat':
matches
>
> test_check("gtreg")
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
══ Skipped tests (4) ═══════════════════════════════════════════════════════════
• On CRAN (4): 'test-add_overall.R:1:1', 'test-tbl_ae.R:1:1',
'test-tbl_ae_count.R:1:1', 'test-tbl_ae_focus.R:1:1'
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-inline_text.R:2:3'): inline text works ─────────────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = df_groups_and_variable, df_stats = list(dplyr::bind_rows(dplyr::group_map(dplyr::group_by(dplyr::filter(df_variable_stats,
!.data$variable_level %in% list(NULL)), .data$variable_level),
function(df_variable_level_stats, df_variable_levels) {
dplyr::mutate(.data = df_variable_levels, stat = map(str_statistic_pre_glue,
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue,
.envir = c(cards::get_ard_statistics(df_variable_level_stats,
.column = "stat_fmt"), lst_variable_stats)))
}), label = map_chr(.data$variable_level, as.character))
}))))`: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
── Error ('test-modify_header.R:2:3'): modify_header() works ───────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(., tbl = switch(.parent_fun, tbl_strata = map(.data$data,
.tbl_fun, ...), tbl_strata2 = map2(.data$data, .data$header,
.tbl_fun, ...)))`: i In argument: `tbl = switch(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─... %>% ... at test-modify_header.R:2:3
2. ├─gtreg::tbl_ae(...)
3. │ └─gtreg:::.construct_summary_table(...)
4. │ └─gtsummary::tbl_strata(...)
5. │ └─gtsummary:::tbl_strata_internal(...)
6. │ └─... %>% ...
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
10. │ ├─base::withCallingHandlers(...)
11. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
12. │ └─mask$eval_all_mutate(quo)
13. │ └─dplyr (local) eval()
14. ├─gtsummary:::map(.data$data, .tbl_fun, ...)
15. │ └─base::lapply(.x, .f, ...)
16. │ └─gtreg (local) FUN(X[[i]], ...)
17. │ └─gtreg (local) .final_summary_fun(data = .x)
18. │ └─gtreg:::.build_single_summary_table(...)
19. │ ├─... %>% gtsummary::tbl_butcher()
20. │ └─gtsummary::tbl_summary(...)
21. │ ├─base::structure(...)
22. │ ├─base::append(...)
23. │ └─gtsummary::brdg_summary(...)
24. │ ├─dplyr::left_join(...)
25. │ ├─dplyr:::left_join.data.frame(...)
26. │ │ └─dplyr::auto_copy(x, y, copy = copy)
27. │ │ ├─dplyr::same_src(x, y)
28. │ │ └─dplyr:::same_src.data.frame(x, y)
29. │ │ └─base::is.data.frame(y)
30. │ ├─dplyr::bind_rows(...)
31. │ │ └─rlang::list2(...)
32. │ └─gtsummary::pier_summary_categorical(...)
33. │ ├─... %>% ...
34. │ ├─dplyr::bind_rows(...)
35. │ │ └─rlang::list2(...)
36. │ ├─dplyr::group_map(...)
37. │ └─dplyr:::group_map.data.frame(...)
38. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
39. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
40. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
41. │ ├─dplyr::mutate(...)
42. │ └─dplyr:::mutate.data.frame(...)
43. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
44. │ ├─base::withCallingHandlers(...)
45. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
46. │ └─mask$eval_all_mutate(quo)
47. │ └─dplyr (local) eval()
48. ├─gtsummary::tbl_butcher(.)
49. │ └─gtsummary:::check_class(x, "gtsummary")
50. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
51. │ └─dplyr::filter(...)
52. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
53. │ ├─base::unique(...)
54. │ ├─dplyr::pull(...)
55. │ └─dplyr::filter(...)
56. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
57. ├─gtreg:::.add_modify_stat_data(.)
58. │ └─tbl$table_styling$header %>% ...
59. ├─dplyr::mutate(...)
60. ├─gtsummary::modify_header(...)
61. ├─gtsummary::remove_row_type(., type = "header")
62. ├─dplyr::left_join(...)
63. ├─dplyr:::left_join.data.frame(...)
64. │ └─dplyr::auto_copy(x, y, copy = copy)
65. │ ├─dplyr::same_src(x, y)
66. │ └─dplyr:::same_src.data.frame(x, y)
67. │ └─base::is.data.frame(y)
68. ├─dplyr::bind_rows(...)
69. │ └─rlang::list2(...)
70. ├─dplyr::group_map(...)
71. ├─dplyr:::group_map.data.frame(...)
72. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
73. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
74. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
75. │ ├─dplyr::mutate(...)
76. │ └─dplyr:::mutate.data.frame(...)
77. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
78. │ ├─base::withCallingHandlers(...)
79. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
80. │ └─mask$eval_all_mutate(quo)
81. │ └─dplyr (local) eval()
82. ├─gtsummary:::map(...)
83. │ └─base::lapply(.x, .f, ...)
84. │ └─gtsummary (local) FUN(X[[i]], ...)
85. │ └─glue::glue(...)
86. │ └─glue::glue_data(...)
87. │ └─base::stopifnot(is.environment(.envir))
88. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
89. ├─dplyr (local) `<fn>`(`<smplErrr>`)
90. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
91. │ └─rlang:::signal_abort(cnd, .file)
92. │ └─base::signalCondition(cnd)
93. ├─dplyr (local) `<fn>`(`<dply:::_>`)
94. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
95. │ └─rlang:::signal_abort(cnd, .file)
96. │ └─base::signalCondition(cnd)
97. └─dplyr (local) `<fn>`(`<dply:::_>`)
98. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:22:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:38:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:52:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In index: 1.
i With name: any_complication.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: purrr_error_indexed/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:52:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_spanning_header(all_ae_cols() ~ "**N = xx**")
8. ├─gtsummary::modify_spanning_header(., all_ae_cols() ~ "**N = xx**")
9. ├─gtreg::tbl_ae_focus(...)
10. │ └─... %>% gtsummary::tbl_merge(tab_spanner = FALSE)
11. ├─gtsummary::tbl_merge(., tab_spanner = FALSE)
12. ├─purrr::imap(...)
13. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
14. │ └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
15. │ ├─purrr:::with_indexed_errors(...)
16. │ │ └─base::withCallingHandlers(...)
17. │ ├─purrr:::call_with_cleanup(...)
18. │ └─gtreg (local) .f(.x[[i]], .y[[i]], ...)
19. │ └─gtreg:::.construct_summary_table(...)
20. │ └─gtreg (local) .final_summary_fun(data)
21. │ └─gtreg:::.build_single_summary_table(...)
22. │ ├─... %>% gtsummary::tbl_butcher()
23. │ └─gtsummary::tbl_summary(...)
24. │ ├─base::structure(...)
25. │ ├─base::append(...)
26. │ └─gtsummary::brdg_summary(...)
27. │ ├─dplyr::left_join(...)
28. │ ├─dplyr:::left_join.data.frame(...)
29. │ │ └─dplyr::auto_copy(x, y, copy = copy)
30. │ │ ├─dplyr::same_src(x, y)
31. │ │ └─dplyr:::same_src.data.frame(x, y)
32. │ │ └─base::is.data.frame(y)
33. │ ├─dplyr::bind_rows(...)
34. │ │ └─rlang::list2(...)
35. │ └─gtsummary::pier_summary_categorical(...)
36. │ ├─... %>% ...
37. │ ├─dplyr::bind_rows(...)
38. │ │ └─rlang::list2(...)
39. │ ├─dplyr::group_map(...)
40. │ └─dplyr:::group_map.data.frame(...)
41. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
42. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
43. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
44. │ ├─dplyr::mutate(...)
45. │ └─dplyr:::mutate.data.frame(...)
46. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
47. │ ├─base::withCallingHandlers(...)
48. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
49. │ └─mask$eval_all_mutate(quo)
50. │ └─dplyr (local) eval()
51. ├─gtsummary::tbl_butcher(.)
52. │ └─gtsummary:::check_class(x, "gtsummary")
53. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
54. │ └─dplyr::filter(...)
55. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
56. │ ├─base::unique(...)
57. │ ├─dplyr::pull(...)
58. │ └─dplyr::filter(...)
59. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
60. ├─gtreg:::.add_modify_stat_data(.)
61. │ └─tbl$table_styling$header %>% ...
62. ├─dplyr::mutate(...)
63. ├─gtsummary::modify_header(...)
64. ├─gtsummary::remove_row_type(., type = "header")
65. ├─dplyr::left_join(...)
66. ├─dplyr:::left_join.data.frame(...)
67. │ └─dplyr::auto_copy(x, y, copy = copy)
68. │ ├─dplyr::same_src(x, y)
69. │ └─dplyr:::same_src.data.frame(x, y)
70. │ └─base::is.data.frame(y)
71. ├─dplyr::bind_rows(...)
72. │ └─rlang::list2(...)
73. ├─dplyr::group_map(...)
74. ├─dplyr:::group_map.data.frame(...)
75. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
76. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
77. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
78. │ ├─dplyr::mutate(...)
79. │ └─dplyr:::mutate.data.frame(...)
80. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
81. │ ├─base::withCallingHandlers(...)
82. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
83. │ └─mask$eval_all_mutate(quo)
84. │ └─dplyr (local) eval()
85. ├─gtsummary:::map(...)
86. │ └─base::lapply(.x, .f, ...)
87. │ └─gtsummary (local) FUN(X[[i]], ...)
88. │ └─glue::glue(...)
89. │ └─glue::glue_data(...)
90. │ └─base::stopifnot(is.environment(.envir))
91. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
92. ├─dplyr (local) `<fn>`(`<smplErrr>`)
93. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
94. │ └─rlang:::signal_abort(cnd, .file)
95. │ └─base::signalCondition(cnd)
96. ├─dplyr (local) `<fn>`(`<dply:::_>`)
97. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
98. │ └─rlang:::signal_abort(cnd, .file)
99. │ └─base::signalCondition(cnd)
100. └─purrr (local) `<fn>`(`<dply:::_>`)
101. └─cli::cli_abort(...)
102. └─rlang::abort(...)
── Error ('test-style_xxx.R:67:3'): style_xxx works with tbl_ae family ─────────
Error: object 't1' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t1)) at test-style_xxx.R:67:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-style_xxx.R:76:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:76:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:90:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:90:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-style_xxx.R:110:3'): style_xxx works with tbl_reg_summary ──────
Error: object 't4' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t4)) at test-style_xxx.R:110:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-tbl_reg_summary.R:2:3'): tbl_reg_summary works ───────────────
``%>%`(...)` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-tbl_reg_summary.R:2:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-tbl_reg_summary.R:9:3'): tbl_reg_summary works ─────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = .y, stat = list(map(statistic[[.y$variable[1]]],
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_fmt")))
})), label = list(map(statistic[[.y$variable[1]]], function(str_to_glue) {
label <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_label")))
})))`: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─testthat::expect_message(...) at test-tbl_reg_summary.R:9:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
Error: Test failures
Execution halted
Flavor: r-devel-windows-x86_64
Version: 0.4.0
Check: tests
Result: ERROR
Running ‘spelling.R’ [0s/0s]
Running ‘testthat.R’ [24s/32s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(gtreg)
Attaching package: 'gtreg'
The following object is masked from 'package:testthat':
matches
>
> test_check("gtreg")
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
══ Skipped tests (4) ═══════════════════════════════════════════════════════════
• On CRAN (4): 'test-add_overall.R:1:1', 'test-tbl_ae.R:1:1',
'test-tbl_ae_count.R:1:1', 'test-tbl_ae_focus.R:1:1'
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-inline_text.R:2:3'): inline text works ─────────────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = df_groups_and_variable, df_stats = list(dplyr::bind_rows(dplyr::group_map(dplyr::group_by(dplyr::filter(df_variable_stats,
!.data$variable_level %in% list(NULL)), .data$variable_level),
function(df_variable_level_stats, df_variable_levels) {
dplyr::mutate(.data = df_variable_levels, stat = map(str_statistic_pre_glue,
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue,
.envir = c(cards::get_ard_statistics(df_variable_level_stats,
.column = "stat_fmt"), lst_variable_stats)))
}), label = map_chr(.data$variable_level, as.character))
}))))`: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
── Error ('test-modify_header.R:2:3'): modify_header() works ───────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(., tbl = switch(.parent_fun, tbl_strata = map(.data$data,
.tbl_fun, ...), tbl_strata2 = map2(.data$data, .data$header,
.tbl_fun, ...)))`: i In argument: `tbl = switch(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─... %>% ... at test-modify_header.R:2:3
2. ├─gtreg::tbl_ae(...)
3. │ └─gtreg:::.construct_summary_table(...)
4. │ └─gtsummary::tbl_strata(...)
5. │ └─gtsummary:::tbl_strata_internal(...)
6. │ └─... %>% ...
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
10. │ ├─base::withCallingHandlers(...)
11. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
12. │ └─mask$eval_all_mutate(quo)
13. │ └─dplyr (local) eval()
14. ├─gtsummary:::map(.data$data, .tbl_fun, ...)
15. │ └─base::lapply(.x, .f, ...)
16. │ └─gtreg (local) FUN(X[[i]], ...)
17. │ └─gtreg (local) .final_summary_fun(data = .x)
18. │ └─gtreg:::.build_single_summary_table(...)
19. │ ├─... %>% gtsummary::tbl_butcher()
20. │ └─gtsummary::tbl_summary(...)
21. │ ├─base::structure(...)
22. │ ├─base::append(...)
23. │ └─gtsummary::brdg_summary(...)
24. │ ├─dplyr::left_join(...)
25. │ ├─dplyr:::left_join.data.frame(...)
26. │ │ └─dplyr::auto_copy(x, y, copy = copy)
27. │ │ ├─dplyr::same_src(x, y)
28. │ │ └─dplyr:::same_src.data.frame(x, y)
29. │ │ └─base::is.data.frame(y)
30. │ ├─dplyr::bind_rows(...)
31. │ │ └─rlang::list2(...)
32. │ └─gtsummary::pier_summary_categorical(...)
33. │ ├─... %>% ...
34. │ ├─dplyr::bind_rows(...)
35. │ │ └─rlang::list2(...)
36. │ ├─dplyr::group_map(...)
37. │ └─dplyr:::group_map.data.frame(...)
38. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
39. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
40. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
41. │ ├─dplyr::mutate(...)
42. │ └─dplyr:::mutate.data.frame(...)
43. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
44. │ ├─base::withCallingHandlers(...)
45. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
46. │ └─mask$eval_all_mutate(quo)
47. │ └─dplyr (local) eval()
48. ├─gtsummary::tbl_butcher(.)
49. │ └─gtsummary:::check_class(x, "gtsummary")
50. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
51. │ └─dplyr::filter(...)
52. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
53. │ ├─base::unique(...)
54. │ ├─dplyr::pull(...)
55. │ └─dplyr::filter(...)
56. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
57. ├─gtreg:::.add_modify_stat_data(.)
58. │ └─tbl$table_styling$header %>% ...
59. ├─dplyr::mutate(...)
60. ├─gtsummary::modify_header(...)
61. ├─gtsummary::remove_row_type(., type = "header")
62. ├─dplyr::left_join(...)
63. ├─dplyr:::left_join.data.frame(...)
64. │ └─dplyr::auto_copy(x, y, copy = copy)
65. │ ├─dplyr::same_src(x, y)
66. │ └─dplyr:::same_src.data.frame(x, y)
67. │ └─base::is.data.frame(y)
68. ├─dplyr::bind_rows(...)
69. │ └─rlang::list2(...)
70. ├─dplyr::group_map(...)
71. ├─dplyr:::group_map.data.frame(...)
72. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
73. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
74. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
75. │ ├─dplyr::mutate(...)
76. │ └─dplyr:::mutate.data.frame(...)
77. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
78. │ ├─base::withCallingHandlers(...)
79. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
80. │ └─mask$eval_all_mutate(quo)
81. │ └─dplyr (local) eval()
82. ├─gtsummary:::map(...)
83. │ └─base::lapply(.x, .f, ...)
84. │ └─gtsummary (local) FUN(X[[i]], ...)
85. │ └─glue::glue(...)
86. │ └─glue::glue_data(...)
87. │ └─base::stopifnot(is.environment(.envir))
88. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
89. ├─dplyr (local) `<fn>`(`<smplErrr>`)
90. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
91. │ └─rlang:::signal_abort(cnd, .file)
92. │ └─base::signalCondition(cnd)
93. ├─dplyr (local) `<fn>`(`<dply:::_>`)
94. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
95. │ └─rlang:::signal_abort(cnd, .file)
96. │ └─base::signalCondition(cnd)
97. └─dplyr (local) `<fn>`(`<dply:::_>`)
98. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:22:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:38:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:52:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In index: 1.
i With name: any_complication.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: purrr_error_indexed/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:52:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_spanning_header(all_ae_cols() ~ "**N = xx**")
8. ├─gtsummary::modify_spanning_header(., all_ae_cols() ~ "**N = xx**")
9. ├─gtreg::tbl_ae_focus(...)
10. │ └─... %>% gtsummary::tbl_merge(tab_spanner = FALSE)
11. ├─gtsummary::tbl_merge(., tab_spanner = FALSE)
12. ├─purrr::imap(...)
13. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
14. │ └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
15. │ ├─purrr:::with_indexed_errors(...)
16. │ │ └─base::withCallingHandlers(...)
17. │ ├─purrr:::call_with_cleanup(...)
18. │ └─gtreg (local) .f(.x[[i]], .y[[i]], ...)
19. │ └─gtreg:::.construct_summary_table(...)
20. │ └─gtreg (local) .final_summary_fun(data)
21. │ └─gtreg:::.build_single_summary_table(...)
22. │ ├─... %>% gtsummary::tbl_butcher()
23. │ └─gtsummary::tbl_summary(...)
24. │ ├─base::structure(...)
25. │ ├─base::append(...)
26. │ └─gtsummary::brdg_summary(...)
27. │ ├─dplyr::left_join(...)
28. │ ├─dplyr:::left_join.data.frame(...)
29. │ │ └─dplyr::auto_copy(x, y, copy = copy)
30. │ │ ├─dplyr::same_src(x, y)
31. │ │ └─dplyr:::same_src.data.frame(x, y)
32. │ │ └─base::is.data.frame(y)
33. │ ├─dplyr::bind_rows(...)
34. │ │ └─rlang::list2(...)
35. │ └─gtsummary::pier_summary_categorical(...)
36. │ ├─... %>% ...
37. │ ├─dplyr::bind_rows(...)
38. │ │ └─rlang::list2(...)
39. │ ├─dplyr::group_map(...)
40. │ └─dplyr:::group_map.data.frame(...)
41. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
42. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
43. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
44. │ ├─dplyr::mutate(...)
45. │ └─dplyr:::mutate.data.frame(...)
46. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
47. │ ├─base::withCallingHandlers(...)
48. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
49. │ └─mask$eval_all_mutate(quo)
50. │ └─dplyr (local) eval()
51. ├─gtsummary::tbl_butcher(.)
52. │ └─gtsummary:::check_class(x, "gtsummary")
53. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
54. │ └─dplyr::filter(...)
55. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
56. │ ├─base::unique(...)
57. │ ├─dplyr::pull(...)
58. │ └─dplyr::filter(...)
59. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
60. ├─gtreg:::.add_modify_stat_data(.)
61. │ └─tbl$table_styling$header %>% ...
62. ├─dplyr::mutate(...)
63. ├─gtsummary::modify_header(...)
64. ├─gtsummary::remove_row_type(., type = "header")
65. ├─dplyr::left_join(...)
66. ├─dplyr:::left_join.data.frame(...)
67. │ └─dplyr::auto_copy(x, y, copy = copy)
68. │ ├─dplyr::same_src(x, y)
69. │ └─dplyr:::same_src.data.frame(x, y)
70. │ └─base::is.data.frame(y)
71. ├─dplyr::bind_rows(...)
72. │ └─rlang::list2(...)
73. ├─dplyr::group_map(...)
74. ├─dplyr:::group_map.data.frame(...)
75. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
76. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
77. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
78. │ ├─dplyr::mutate(...)
79. │ └─dplyr:::mutate.data.frame(...)
80. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
81. │ ├─base::withCallingHandlers(...)
82. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
83. │ └─mask$eval_all_mutate(quo)
84. │ └─dplyr (local) eval()
85. ├─gtsummary:::map(...)
86. │ └─base::lapply(.x, .f, ...)
87. │ └─gtsummary (local) FUN(X[[i]], ...)
88. │ └─glue::glue(...)
89. │ └─glue::glue_data(...)
90. │ └─base::stopifnot(is.environment(.envir))
91. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
92. ├─dplyr (local) `<fn>`(`<smplErrr>`)
93. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
94. │ └─rlang:::signal_abort(cnd, .file)
95. │ └─base::signalCondition(cnd)
96. ├─dplyr (local) `<fn>`(`<dply:::_>`)
97. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
98. │ └─rlang:::signal_abort(cnd, .file)
99. │ └─base::signalCondition(cnd)
100. └─purrr (local) `<fn>`(`<dply:::_>`)
101. └─cli::cli_abort(...)
102. └─rlang::abort(...)
── Error ('test-style_xxx.R:67:3'): style_xxx works with tbl_ae family ─────────
Error: object 't1' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t1)) at test-style_xxx.R:67:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-style_xxx.R:76:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:76:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:90:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:90:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-style_xxx.R:110:3'): style_xxx works with tbl_reg_summary ──────
Error: object 't4' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t4)) at test-style_xxx.R:110:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-tbl_reg_summary.R:2:3'): tbl_reg_summary works ───────────────
``%>%`(...)` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-tbl_reg_summary.R:2:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-tbl_reg_summary.R:9:3'): tbl_reg_summary works ─────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = .y, stat = list(map(statistic[[.y$variable[1]]],
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_fmt")))
})), label = list(map(statistic[[.y$variable[1]]], function(str_to_glue) {
label <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_label")))
})))`: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─testthat::expect_message(...) at test-tbl_reg_summary.R:9:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
Error: Test failures
Execution halted
Flavor: r-patched-linux-x86_64
Version: 0.4.0
Check: tests
Result: ERROR
Running ‘spelling.R’ [0s/0s]
Running ‘testthat.R’ [24s/29s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(gtreg)
Attaching package: 'gtreg'
The following object is masked from 'package:testthat':
matches
>
> test_check("gtreg")
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
══ Skipped tests (4) ═══════════════════════════════════════════════════════════
• On CRAN (4): 'test-add_overall.R:1:1', 'test-tbl_ae.R:1:1',
'test-tbl_ae_count.R:1:1', 'test-tbl_ae_focus.R:1:1'
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-inline_text.R:2:3'): inline text works ─────────────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = df_groups_and_variable, df_stats = list(dplyr::bind_rows(dplyr::group_map(dplyr::group_by(dplyr::filter(df_variable_stats,
!.data$variable_level %in% list(NULL)), .data$variable_level),
function(df_variable_level_stats, df_variable_levels) {
dplyr::mutate(.data = df_variable_levels, stat = map(str_statistic_pre_glue,
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue,
.envir = c(cards::get_ard_statistics(df_variable_level_stats,
.column = "stat_fmt"), lst_variable_stats)))
}), label = map_chr(.data$variable_level, as.character))
}))))`: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
── Error ('test-modify_header.R:2:3'): modify_header() works ───────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(., tbl = switch(.parent_fun, tbl_strata = map(.data$data,
.tbl_fun, ...), tbl_strata2 = map2(.data$data, .data$header,
.tbl_fun, ...)))`: i In argument: `tbl = switch(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─... %>% ... at test-modify_header.R:2:3
2. ├─gtreg::tbl_ae(...)
3. │ └─gtreg:::.construct_summary_table(...)
4. │ └─gtsummary::tbl_strata(...)
5. │ └─gtsummary:::tbl_strata_internal(...)
6. │ └─... %>% ...
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
10. │ ├─base::withCallingHandlers(...)
11. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
12. │ └─mask$eval_all_mutate(quo)
13. │ └─dplyr (local) eval()
14. ├─gtsummary:::map(.data$data, .tbl_fun, ...)
15. │ └─base::lapply(.x, .f, ...)
16. │ └─gtreg (local) FUN(X[[i]], ...)
17. │ └─gtreg (local) .final_summary_fun(data = .x)
18. │ └─gtreg:::.build_single_summary_table(...)
19. │ ├─... %>% gtsummary::tbl_butcher()
20. │ └─gtsummary::tbl_summary(...)
21. │ ├─base::structure(...)
22. │ ├─base::append(...)
23. │ └─gtsummary::brdg_summary(...)
24. │ ├─dplyr::left_join(...)
25. │ ├─dplyr:::left_join.data.frame(...)
26. │ │ └─dplyr::auto_copy(x, y, copy = copy)
27. │ │ ├─dplyr::same_src(x, y)
28. │ │ └─dplyr:::same_src.data.frame(x, y)
29. │ │ └─base::is.data.frame(y)
30. │ ├─dplyr::bind_rows(...)
31. │ │ └─rlang::list2(...)
32. │ └─gtsummary::pier_summary_categorical(...)
33. │ ├─... %>% ...
34. │ ├─dplyr::bind_rows(...)
35. │ │ └─rlang::list2(...)
36. │ ├─dplyr::group_map(...)
37. │ └─dplyr:::group_map.data.frame(...)
38. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
39. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
40. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
41. │ ├─dplyr::mutate(...)
42. │ └─dplyr:::mutate.data.frame(...)
43. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
44. │ ├─base::withCallingHandlers(...)
45. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
46. │ └─mask$eval_all_mutate(quo)
47. │ └─dplyr (local) eval()
48. ├─gtsummary::tbl_butcher(.)
49. │ └─gtsummary:::check_class(x, "gtsummary")
50. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
51. │ └─dplyr::filter(...)
52. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
53. │ ├─base::unique(...)
54. │ ├─dplyr::pull(...)
55. │ └─dplyr::filter(...)
56. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
57. ├─gtreg:::.add_modify_stat_data(.)
58. │ └─tbl$table_styling$header %>% ...
59. ├─dplyr::mutate(...)
60. ├─gtsummary::modify_header(...)
61. ├─gtsummary::remove_row_type(., type = "header")
62. ├─dplyr::left_join(...)
63. ├─dplyr:::left_join.data.frame(...)
64. │ └─dplyr::auto_copy(x, y, copy = copy)
65. │ ├─dplyr::same_src(x, y)
66. │ └─dplyr:::same_src.data.frame(x, y)
67. │ └─base::is.data.frame(y)
68. ├─dplyr::bind_rows(...)
69. │ └─rlang::list2(...)
70. ├─dplyr::group_map(...)
71. ├─dplyr:::group_map.data.frame(...)
72. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
73. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
74. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
75. │ ├─dplyr::mutate(...)
76. │ └─dplyr:::mutate.data.frame(...)
77. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
78. │ ├─base::withCallingHandlers(...)
79. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
80. │ └─mask$eval_all_mutate(quo)
81. │ └─dplyr (local) eval()
82. ├─gtsummary:::map(...)
83. │ └─base::lapply(.x, .f, ...)
84. │ └─gtsummary (local) FUN(X[[i]], ...)
85. │ └─glue::glue(...)
86. │ └─glue::glue_data(...)
87. │ └─base::stopifnot(is.environment(.envir))
88. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
89. ├─dplyr (local) `<fn>`(`<smplErrr>`)
90. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
91. │ └─rlang:::signal_abort(cnd, .file)
92. │ └─base::signalCondition(cnd)
93. ├─dplyr (local) `<fn>`(`<dply:::_>`)
94. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
95. │ └─rlang:::signal_abort(cnd, .file)
96. │ └─base::signalCondition(cnd)
97. └─dplyr (local) `<fn>`(`<dply:::_>`)
98. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:22:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:38:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:52:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In index: 1.
i With name: any_complication.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: purrr_error_indexed/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:52:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_spanning_header(all_ae_cols() ~ "**N = xx**")
8. ├─gtsummary::modify_spanning_header(., all_ae_cols() ~ "**N = xx**")
9. ├─gtreg::tbl_ae_focus(...)
10. │ └─... %>% gtsummary::tbl_merge(tab_spanner = FALSE)
11. ├─gtsummary::tbl_merge(., tab_spanner = FALSE)
12. ├─purrr::imap(...)
13. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
14. │ └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
15. │ ├─purrr:::with_indexed_errors(...)
16. │ │ └─base::withCallingHandlers(...)
17. │ ├─purrr:::call_with_cleanup(...)
18. │ └─gtreg (local) .f(.x[[i]], .y[[i]], ...)
19. │ └─gtreg:::.construct_summary_table(...)
20. │ └─gtreg (local) .final_summary_fun(data)
21. │ └─gtreg:::.build_single_summary_table(...)
22. │ ├─... %>% gtsummary::tbl_butcher()
23. │ └─gtsummary::tbl_summary(...)
24. │ ├─base::structure(...)
25. │ ├─base::append(...)
26. │ └─gtsummary::brdg_summary(...)
27. │ ├─dplyr::left_join(...)
28. │ ├─dplyr:::left_join.data.frame(...)
29. │ │ └─dplyr::auto_copy(x, y, copy = copy)
30. │ │ ├─dplyr::same_src(x, y)
31. │ │ └─dplyr:::same_src.data.frame(x, y)
32. │ │ └─base::is.data.frame(y)
33. │ ├─dplyr::bind_rows(...)
34. │ │ └─rlang::list2(...)
35. │ └─gtsummary::pier_summary_categorical(...)
36. │ ├─... %>% ...
37. │ ├─dplyr::bind_rows(...)
38. │ │ └─rlang::list2(...)
39. │ ├─dplyr::group_map(...)
40. │ └─dplyr:::group_map.data.frame(...)
41. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
42. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
43. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
44. │ ├─dplyr::mutate(...)
45. │ └─dplyr:::mutate.data.frame(...)
46. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
47. │ ├─base::withCallingHandlers(...)
48. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
49. │ └─mask$eval_all_mutate(quo)
50. │ └─dplyr (local) eval()
51. ├─gtsummary::tbl_butcher(.)
52. │ └─gtsummary:::check_class(x, "gtsummary")
53. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
54. │ └─dplyr::filter(...)
55. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
56. │ ├─base::unique(...)
57. │ ├─dplyr::pull(...)
58. │ └─dplyr::filter(...)
59. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
60. ├─gtreg:::.add_modify_stat_data(.)
61. │ └─tbl$table_styling$header %>% ...
62. ├─dplyr::mutate(...)
63. ├─gtsummary::modify_header(...)
64. ├─gtsummary::remove_row_type(., type = "header")
65. ├─dplyr::left_join(...)
66. ├─dplyr:::left_join.data.frame(...)
67. │ └─dplyr::auto_copy(x, y, copy = copy)
68. │ ├─dplyr::same_src(x, y)
69. │ └─dplyr:::same_src.data.frame(x, y)
70. │ └─base::is.data.frame(y)
71. ├─dplyr::bind_rows(...)
72. │ └─rlang::list2(...)
73. ├─dplyr::group_map(...)
74. ├─dplyr:::group_map.data.frame(...)
75. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
76. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
77. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
78. │ ├─dplyr::mutate(...)
79. │ └─dplyr:::mutate.data.frame(...)
80. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
81. │ ├─base::withCallingHandlers(...)
82. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
83. │ └─mask$eval_all_mutate(quo)
84. │ └─dplyr (local) eval()
85. ├─gtsummary:::map(...)
86. │ └─base::lapply(.x, .f, ...)
87. │ └─gtsummary (local) FUN(X[[i]], ...)
88. │ └─glue::glue(...)
89. │ └─glue::glue_data(...)
90. │ └─base::stopifnot(is.environment(.envir))
91. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
92. ├─dplyr (local) `<fn>`(`<smplErrr>`)
93. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
94. │ └─rlang:::signal_abort(cnd, .file)
95. │ └─base::signalCondition(cnd)
96. ├─dplyr (local) `<fn>`(`<dply:::_>`)
97. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
98. │ └─rlang:::signal_abort(cnd, .file)
99. │ └─base::signalCondition(cnd)
100. └─purrr (local) `<fn>`(`<dply:::_>`)
101. └─cli::cli_abort(...)
102. └─rlang::abort(...)
── Error ('test-style_xxx.R:67:3'): style_xxx works with tbl_ae family ─────────
Error: object 't1' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t1)) at test-style_xxx.R:67:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-style_xxx.R:76:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:76:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:90:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:90:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-style_xxx.R:110:3'): style_xxx works with tbl_reg_summary ──────
Error: object 't4' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t4)) at test-style_xxx.R:110:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-tbl_reg_summary.R:2:3'): tbl_reg_summary works ───────────────
``%>%`(...)` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-tbl_reg_summary.R:2:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-tbl_reg_summary.R:9:3'): tbl_reg_summary works ─────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = .y, stat = list(map(statistic[[.y$variable[1]]],
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_fmt")))
})), label = list(map(statistic[[.y$variable[1]]], function(str_to_glue) {
label <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_label")))
})))`: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─testthat::expect_message(...) at test-tbl_reg_summary.R:9:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
Error: Test failures
Execution halted
Flavor: r-release-linux-x86_64
Version: 0.4.0
Check: tests
Result: ERROR
Running 'spelling.R' [0s]
Running 'testthat.R' [27s]
Running the tests in 'tests/testthat.R' failed.
Complete output:
> library(testthat)
> library(gtreg)
Attaching package: 'gtreg'
The following object is masked from 'package:testthat':
matches
>
> test_check("gtreg")
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
══ Skipped tests (4) ═══════════════════════════════════════════════════════════
• On CRAN (4): 'test-add_overall.R:1:1', 'test-tbl_ae.R:1:1',
'test-tbl_ae_count.R:1:1', 'test-tbl_ae_focus.R:1:1'
══ Failed tests ════════════════════════════════════════════════════════════════
── Error ('test-inline_text.R:2:3'): inline text works ─────────────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = df_groups_and_variable, df_stats = list(dplyr::bind_rows(dplyr::group_map(dplyr::group_by(dplyr::filter(df_variable_stats,
!.data$variable_level %in% list(NULL)), .data$variable_level),
function(df_variable_level_stats, df_variable_levels) {
dplyr::mutate(.data = df_variable_levels, stat = map(str_statistic_pre_glue,
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue,
.envir = c(cards::get_ard_statistics(df_variable_level_stats,
.column = "stat_fmt"), lst_variable_stats)))
}), label = map_chr(.data$variable_level, as.character))
}))))`: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
── Error ('test-modify_header.R:2:3'): modify_header() works ───────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(., tbl = switch(.parent_fun, tbl_strata = map(.data$data,
.tbl_fun, ...), tbl_strata2 = map2(.data$data, .data$header,
.tbl_fun, ...)))`: i In argument: `tbl = switch(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─... %>% ... at test-modify_header.R:2:3
2. ├─gtreg::tbl_ae(...)
3. │ └─gtreg:::.construct_summary_table(...)
4. │ └─gtsummary::tbl_strata(...)
5. │ └─gtsummary:::tbl_strata_internal(...)
6. │ └─... %>% ...
7. ├─dplyr::mutate(...)
8. ├─dplyr:::mutate.data.frame(...)
9. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
10. │ ├─base::withCallingHandlers(...)
11. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
12. │ └─mask$eval_all_mutate(quo)
13. │ └─dplyr (local) eval()
14. ├─gtsummary:::map(.data$data, .tbl_fun, ...)
15. │ └─base::lapply(.x, .f, ...)
16. │ └─gtreg (local) FUN(X[[i]], ...)
17. │ └─gtreg (local) .final_summary_fun(data = .x)
18. │ └─gtreg:::.build_single_summary_table(...)
19. │ ├─... %>% gtsummary::tbl_butcher()
20. │ └─gtsummary::tbl_summary(...)
21. │ ├─base::structure(...)
22. │ ├─base::append(...)
23. │ └─gtsummary::brdg_summary(...)
24. │ ├─dplyr::left_join(...)
25. │ ├─dplyr:::left_join.data.frame(...)
26. │ │ └─dplyr::auto_copy(x, y, copy = copy)
27. │ │ ├─dplyr::same_src(x, y)
28. │ │ └─dplyr:::same_src.data.frame(x, y)
29. │ │ └─base::is.data.frame(y)
30. │ ├─dplyr::bind_rows(...)
31. │ │ └─rlang::list2(...)
32. │ └─gtsummary::pier_summary_categorical(...)
33. │ ├─... %>% ...
34. │ ├─dplyr::bind_rows(...)
35. │ │ └─rlang::list2(...)
36. │ ├─dplyr::group_map(...)
37. │ └─dplyr:::group_map.data.frame(...)
38. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
39. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
40. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
41. │ ├─dplyr::mutate(...)
42. │ └─dplyr:::mutate.data.frame(...)
43. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
44. │ ├─base::withCallingHandlers(...)
45. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
46. │ └─mask$eval_all_mutate(quo)
47. │ └─dplyr (local) eval()
48. ├─gtsummary::tbl_butcher(.)
49. │ └─gtsummary:::check_class(x, "gtsummary")
50. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
51. │ └─dplyr::filter(...)
52. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
53. │ ├─base::unique(...)
54. │ ├─dplyr::pull(...)
55. │ └─dplyr::filter(...)
56. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
57. ├─gtreg:::.add_modify_stat_data(.)
58. │ └─tbl$table_styling$header %>% ...
59. ├─dplyr::mutate(...)
60. ├─gtsummary::modify_header(...)
61. ├─gtsummary::remove_row_type(., type = "header")
62. ├─dplyr::left_join(...)
63. ├─dplyr:::left_join.data.frame(...)
64. │ └─dplyr::auto_copy(x, y, copy = copy)
65. │ ├─dplyr::same_src(x, y)
66. │ └─dplyr:::same_src.data.frame(x, y)
67. │ └─base::is.data.frame(y)
68. ├─dplyr::bind_rows(...)
69. │ └─rlang::list2(...)
70. ├─dplyr::group_map(...)
71. ├─dplyr:::group_map.data.frame(...)
72. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
73. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
74. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
75. │ ├─dplyr::mutate(...)
76. │ └─dplyr:::mutate.data.frame(...)
77. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
78. │ ├─base::withCallingHandlers(...)
79. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
80. │ └─mask$eval_all_mutate(quo)
81. │ └─dplyr (local) eval()
82. ├─gtsummary:::map(...)
83. │ └─base::lapply(.x, .f, ...)
84. │ └─gtsummary (local) FUN(X[[i]], ...)
85. │ └─glue::glue(...)
86. │ └─glue::glue_data(...)
87. │ └─base::stopifnot(is.environment(.envir))
88. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
89. ├─dplyr (local) `<fn>`(`<smplErrr>`)
90. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
91. │ └─rlang:::signal_abort(cnd, .file)
92. │ └─base::signalCondition(cnd)
93. ├─dplyr (local) `<fn>`(`<dply:::_>`)
94. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
95. │ └─rlang:::signal_abort(cnd, .file)
96. │ └─base::signalCondition(cnd)
97. └─dplyr (local) `<fn>`(`<dply:::_>`)
98. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:22:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:38:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
── Failure ('test-style_xxx.R:52:3'): style_xxx works with tbl_ae family ───────
`... <- NULL` threw an unexpected error.
Message: i In index: 1.
i With name: any_complication.
Caused by error in `dplyr::mutate()`:
i In argument: `df_stats = list(...)`.
Caused by error in `dplyr::mutate()`:
i In argument: `stat = map(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: purrr_error_indexed/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:52:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_spanning_header(all_ae_cols() ~ "**N = xx**")
8. ├─gtsummary::modify_spanning_header(., all_ae_cols() ~ "**N = xx**")
9. ├─gtreg::tbl_ae_focus(...)
10. │ └─... %>% gtsummary::tbl_merge(tab_spanner = FALSE)
11. ├─gtsummary::tbl_merge(., tab_spanner = FALSE)
12. ├─purrr::imap(...)
13. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
14. │ └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
15. │ ├─purrr:::with_indexed_errors(...)
16. │ │ └─base::withCallingHandlers(...)
17. │ ├─purrr:::call_with_cleanup(...)
18. │ └─gtreg (local) .f(.x[[i]], .y[[i]], ...)
19. │ └─gtreg:::.construct_summary_table(...)
20. │ └─gtreg (local) .final_summary_fun(data)
21. │ └─gtreg:::.build_single_summary_table(...)
22. │ ├─... %>% gtsummary::tbl_butcher()
23. │ └─gtsummary::tbl_summary(...)
24. │ ├─base::structure(...)
25. │ ├─base::append(...)
26. │ └─gtsummary::brdg_summary(...)
27. │ ├─dplyr::left_join(...)
28. │ ├─dplyr:::left_join.data.frame(...)
29. │ │ └─dplyr::auto_copy(x, y, copy = copy)
30. │ │ ├─dplyr::same_src(x, y)
31. │ │ └─dplyr:::same_src.data.frame(x, y)
32. │ │ └─base::is.data.frame(y)
33. │ ├─dplyr::bind_rows(...)
34. │ │ └─rlang::list2(...)
35. │ └─gtsummary::pier_summary_categorical(...)
36. │ ├─... %>% ...
37. │ ├─dplyr::bind_rows(...)
38. │ │ └─rlang::list2(...)
39. │ ├─dplyr::group_map(...)
40. │ └─dplyr:::group_map.data.frame(...)
41. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
42. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
43. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
44. │ ├─dplyr::mutate(...)
45. │ └─dplyr:::mutate.data.frame(...)
46. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
47. │ ├─base::withCallingHandlers(...)
48. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
49. │ └─mask$eval_all_mutate(quo)
50. │ └─dplyr (local) eval()
51. ├─gtsummary::tbl_butcher(.)
52. │ └─gtsummary:::check_class(x, "gtsummary")
53. ├─gtreg:::.replace_zero_with_NA(., zero_symbol = zero_symbol)
54. │ └─dplyr::filter(...)
55. ├─gtreg:::.hide_unobserved_columns(., columns = columns_to_hide)
56. │ ├─base::unique(...)
57. │ ├─dplyr::pull(...)
58. │ └─dplyr::filter(...)
59. ├─gtreg:::.relocate_missing_column(., missing_location = missing_location)
60. ├─gtreg:::.add_modify_stat_data(.)
61. │ └─tbl$table_styling$header %>% ...
62. ├─dplyr::mutate(...)
63. ├─gtsummary::modify_header(...)
64. ├─gtsummary::remove_row_type(., type = "header")
65. ├─dplyr::left_join(...)
66. ├─dplyr:::left_join.data.frame(...)
67. │ └─dplyr::auto_copy(x, y, copy = copy)
68. │ ├─dplyr::same_src(x, y)
69. │ └─dplyr:::same_src.data.frame(x, y)
70. │ └─base::is.data.frame(y)
71. ├─dplyr::bind_rows(...)
72. │ └─rlang::list2(...)
73. ├─dplyr::group_map(...)
74. ├─dplyr:::group_map.data.frame(...)
75. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
76. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
77. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
78. │ ├─dplyr::mutate(...)
79. │ └─dplyr:::mutate.data.frame(...)
80. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
81. │ ├─base::withCallingHandlers(...)
82. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
83. │ └─mask$eval_all_mutate(quo)
84. │ └─dplyr (local) eval()
85. ├─gtsummary:::map(...)
86. │ └─base::lapply(.x, .f, ...)
87. │ └─gtsummary (local) FUN(X[[i]], ...)
88. │ └─glue::glue(...)
89. │ └─glue::glue_data(...)
90. │ └─base::stopifnot(is.environment(.envir))
91. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
92. ├─dplyr (local) `<fn>`(`<smplErrr>`)
93. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
94. │ └─rlang:::signal_abort(cnd, .file)
95. │ └─base::signalCondition(cnd)
96. ├─dplyr (local) `<fn>`(`<dply:::_>`)
97. │ └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
98. │ └─rlang:::signal_abort(cnd, .file)
99. │ └─base::signalCondition(cnd)
100. └─purrr (local) `<fn>`(`<dply:::_>`)
101. └─cli::cli_abort(...)
102. └─rlang::abort(...)
── Error ('test-style_xxx.R:67:3'): style_xxx works with tbl_ae family ─────────
Error: object 't1' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t1)) at test-style_xxx.R:67:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-style_xxx.R:76:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:76:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Failure ('test-style_xxx.R:90:3'): style_xxx works with tbl_reg_summary ─────
`... <- NULL` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-style_xxx.R:90:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─... %>% modify_header(stat_0 ~ "**N = xx**")
8. ├─gtsummary::modify_header(., stat_0 ~ "**N = xx**")
9. ├─gtreg::tbl_reg_summary(...)
10. │ ├─... %>% ...
11. │ ├─gtsummary::with_gtsummary_theme(...)
12. │ │ └─rlang::eval_tidy(...)
13. │ └─gtsummary::tbl_summary(...)
14. │ ├─base::structure(...)
15. │ ├─base::append(...)
16. │ └─gtsummary::brdg_summary(...)
17. │ ├─dplyr::left_join(...)
18. │ ├─dplyr:::left_join.data.frame(...)
19. │ │ └─dplyr::auto_copy(x, y, copy = copy)
20. │ │ ├─dplyr::same_src(x, y)
21. │ │ └─dplyr:::same_src.data.frame(x, y)
22. │ │ └─base::is.data.frame(y)
23. │ ├─dplyr::bind_rows(...)
24. │ │ └─rlang::list2(...)
25. │ └─gtsummary::pier_summary_continuous2(...)
26. │ ├─... %>% ...
27. │ ├─dplyr::bind_rows(...)
28. │ │ └─rlang::list2(...)
29. │ ├─dplyr::group_map(...)
30. │ └─dplyr:::group_map.data.frame(...)
31. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
32. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
33. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
34. │ ├─dplyr::mutate(...)
35. │ └─dplyr:::mutate.data.frame(...)
36. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
37. │ ├─base::withCallingHandlers(...)
38. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
39. │ └─mask$eval_all_mutate(quo)
40. │ └─dplyr (local) eval()
41. ├─base::structure(...)
42. ├─dplyr::left_join(...)
43. ├─dplyr:::left_join.data.frame(...)
44. │ └─dplyr::auto_copy(x, y, copy = copy)
45. │ ├─dplyr::same_src(x, y)
46. │ └─dplyr:::same_src.data.frame(x, y)
47. │ └─base::is.data.frame(y)
48. ├─gtsummary:::map(...)
49. │ └─base::lapply(.x, .f, ...)
50. │ └─gtsummary (local) FUN(X[[i]], ...)
51. │ └─glue::glue(...)
52. │ └─glue::glue_data(...)
53. │ └─base::stopifnot(is.environment(.envir))
54. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
55. └─dplyr (local) `<fn>`(`<smplErrr>`)
56. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-style_xxx.R:110:3'): style_xxx works with tbl_reg_summary ──────
Error: object 't4' not found
Backtrace:
▆
1. └─testthat::expect_snapshot(as.data.frame(t4)) at test-style_xxx.R:110:3
2. └─rlang::cnd_signal(state$error)
── Failure ('test-tbl_reg_summary.R:2:3'): tbl_reg_summary works ───────────────
``%>%`(...)` threw an unexpected error.
Message: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Class: dplyr:::mutate_error/rlang_error/error/condition
Backtrace:
▆
1. ├─testthat::expect_error(...) at test-tbl_reg_summary.R:2:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
── Error ('test-tbl_reg_summary.R:9:3'): tbl_reg_summary works ─────────────────
<dplyr:::mutate_error/rlang_error/error/condition>
Error in `dplyr::mutate(.data = .y, stat = list(map(statistic[[.y$variable[1]]],
function(str_to_glue) {
stat <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_fmt")))
})), label = list(map(statistic[[.y$variable[1]]], function(str_to_glue) {
label <- as.character(glue::glue(str_to_glue, .envir = cards::get_ard_statistics(.x,
.column = "stat_label")))
})))`: i In argument: `stat = list(...)`.
Caused by error in `glue_data()`:
! is.environment(.envir) is not TRUE
Backtrace:
▆
1. ├─testthat::expect_message(...) at test-tbl_reg_summary.R:9:3
2. │ └─testthat:::expect_condition_matching(...)
3. │ └─testthat:::quasi_capture(...)
4. │ ├─testthat (local) .capture(...)
5. │ │ └─base::withCallingHandlers(...)
6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo))
7. ├─df_patient_characteristics %>% ...
8. ├─gtreg::tbl_reg_summary(., by = trt, include = c(marker, status))
9. │ ├─... %>% ...
10. │ ├─gtsummary::with_gtsummary_theme(...)
11. │ │ └─rlang::eval_tidy(...)
12. │ └─gtsummary::tbl_summary(...)
13. │ ├─base::structure(...)
14. │ ├─base::append(...)
15. │ └─gtsummary::brdg_summary(...)
16. │ ├─dplyr::left_join(...)
17. │ ├─dplyr:::left_join.data.frame(...)
18. │ │ └─dplyr::auto_copy(x, y, copy = copy)
19. │ │ ├─dplyr::same_src(x, y)
20. │ │ └─dplyr:::same_src.data.frame(x, y)
21. │ │ └─base::is.data.frame(y)
22. │ ├─dplyr::bind_rows(...)
23. │ │ └─rlang::list2(...)
24. │ └─gtsummary::pier_summary_continuous2(...)
25. │ ├─... %>% ...
26. │ ├─dplyr::bind_rows(...)
27. │ │ └─rlang::list2(...)
28. │ ├─dplyr::group_map(...)
29. │ └─dplyr:::group_map.data.frame(...)
30. │ └─dplyr:::map2(chunks, group_keys, .f, ...)
31. │ └─base::mapply(.f, .x, .y, MoreArgs = list(...), SIMPLIFY = FALSE)
32. │ └─gtsummary (local) `<fn>`(dots[[1L]][[1L]], dots[[2L]][[1L]])
33. │ ├─dplyr::mutate(...)
34. │ └─dplyr:::mutate.data.frame(...)
35. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), by)
36. │ ├─base::withCallingHandlers(...)
37. │ └─dplyr:::mutate_col(dots[[i]], data, mask, new_columns)
38. │ └─mask$eval_all_mutate(quo)
39. │ └─dplyr (local) eval()
40. ├─base::structure(...)
41. ├─dplyr::left_join(...)
42. ├─dplyr:::left_join.data.frame(...)
43. │ └─dplyr::auto_copy(x, y, copy = copy)
44. │ ├─dplyr::same_src(x, y)
45. │ └─dplyr:::same_src.data.frame(x, y)
46. │ └─base::is.data.frame(y)
47. ├─gtsummary:::map(...)
48. │ └─base::lapply(.x, .f, ...)
49. │ └─gtsummary (local) FUN(X[[i]], ...)
50. │ └─glue::glue(...)
51. │ └─glue::glue_data(...)
52. │ └─base::stopifnot(is.environment(.envir))
53. │ └─base::stop(simpleError(msg, call = if (p <- sys.parent(1L)) sys.call(p)))
54. └─dplyr (local) `<fn>`(`<smplErrr>`)
55. └─rlang::abort(message, class = error_class, parent = parent, call = error_call)
[ FAIL 11 | WARN 34 | SKIP 4 | PASS 65 ]
Error: Test failures
Execution halted
Flavor: r-oldrel-windows-x86_64