r-lib / lifecycle

Manage the life cycle of your exported functions and arguments
https://lifecycle.r-lib.org
Other
95 stars 25 forks source link

lifecycle doesn't properly detect deprecated call location #186

Open olivroy opened 2 months ago

olivroy commented 2 months ago
library(gt)
exibble |> 
  gt(groupname_col = "group") |> 
  summary_rows(
    columns = num,
    fns = ~ .x ^ 2
  )
#> Warning: Returning more (or less) than 1 row per `summarise()` group was deprecated in
#> dplyr 1.1.0.
#> ℹ Please use `reframe()` instead.
#> ℹ When switching from `summarise()` to `reframe()`, remember that `reframe()`
#>   always returns an ungrouped data frame and adjust accordingly.
#> ℹ The deprecated feature was likely used in the dplyr package.
#>   Please report the issue at <https://github.com/tidyverse/dplyr/issues>.
#> This warning is displayed once every 8 hours.
#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
#> generated.
Backtrace:
     ▆
  1. ├─base (local) `<fn>`(x)
  2. └─gt:::print.gt_tbl(x)
  3.   ├─htmltools::as.tags(x, ...) at gt/R/print.R:42:3
  4.   └─gt:::as.tags.gt_tbl(x, ...)
  5.     ├─htmltools::HTML(render_as_html(data = x)) at gt/R/print.R:212:5
  6.     └─gt:::render_as_html(data = x) at gt/R/print.R:212:5
  7.       └─gt:::build_data(data = data, context = "html") at gt/R/render_as_html.R:36:3
  8.         └─gt:::dt_summary_build(data = data, context = context) at gt/R/build_data.R:62:3
  9.           ├─dplyr::bind_rows(...) at gt/R/dt_summary.R:201:5
 10.           │ └─rlang::list2(...)
 11.           └─base::lapply(...) at rlang/R/dots.R:91:3
 12.             └─gt (local) FUN(X[[i]], ...)
 13.               ├─dplyr::ungroup(...) at gt/R/dt_summary.R:234:13
 14.               └─dplyr::summarize_at(select_data_tbl, columns, .funs = fn_formula)
 15.                 ├─dplyr::summarise(.tbl, !!!funs)
 16.                 └─dplyr:::summarise.grouped_df(.tbl, !!!funs)
 17.                   └─dplyr:::summarise_deprecate_variable_size()

It would probably be fixed if we got rid of summarise_at() in gt.