gtsummary suddenly causing error issues

gtsummary was working fine; now is giving following error issue -

table1_descriptives_fullcases <- ComPAS_MUAC115_LinearGrowth_ForAnalysis_completecases_tbl1 %>% tbl_summary(by = control_str2, # Add a comma here
+   type = list(all_continuous() ~ "continuous2"),
+   statistic = all_continuous() ~ c("{mean} +/- {sd}",
+                                       "{median} ({p25}, {p75})",
+                                       "{min}, {max}"),
+   digits = list(all_continuous() ~ 1, all_categorical() ~ 1),
+   missing = "no") %>%
+   add_n() %>% # add column with total number of non-missing observations
+   add_p() %>% # test for a difference between groups
+   add_overall() %>%
+   modify_header(label = "**Variable**") %>% # update the column header
+   modify_caption("**Unadjusted Table 1: By control group - Complete cases only**") %>%
+   bold_labels() %>%
+   bold_p()
Error in `mutate()`:
ℹ In argument: `df_stats = pmap(...)`.
Caused by error in `pmap()`:
ℹ In index: 3.
Caused by error in `abort()`:
! `message` must be a character vector, not a <rlang_error/error/condition> object.
Backtrace:
  1. ... %>% bold_p()
 31. gtsummary:::safe_summarise_at(., variable = variable, fns = fns)
 32. base::tryCatch(...)
 33. base (local) tryCatchList(expr, classes, parentenv, handlers)
 34. base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
 35. value[[3L]](cond)
 36. rlang::abort(message = e)

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.