probably icon indicating copy to clipboard operation
probably copied to clipboard

deprecation condition for `purrr::transpose()`

Open simonpcouch opened this issue 1 year ago • 0 comments

Seeing the following deprecation condition while testing tailor:

transpose() is superseded. Please use `list_transpose()` instead.

Traceback:

  8. ├─generics::fit(tlr, d_calibration, outcome = y, estimate = y_pred)
  9. ├─tailor:::fit.tailor(tlr, d_calibration, outcome = y, estimate = y_pred)
 10. │ ├─stats::predict(object$adjustments[[adj]], .data, object) at tailor/R/tailor.R:191:5
 11. │ └─tailor:::predict.numeric_calibration(...)
 12. │   ├─probably::cal_apply(new_data, object$results$fit) at tailor/R/adjust-numeric-calibration.R:114:3
 13. │   └─probably:::cal_apply.data.frame(new_data, object$results$fit)
 14. │     └─probably:::cal_adjust_update(...)
 15. │       ├─probably:::cal_adjust(object = object, .data = .data, pred_class = !!pred_class)
 16. │       └─probably:::cal_adjust.cal_estimate_isotonic(...)
 17. │         └─probably:::apply_interval_impl(...)
 18. │           └─... %>% purrr::reduce(dplyr::bind_rows)
 19. ├─purrr::reduce(., dplyr::bind_rows)
 20. │ └─purrr:::reduce_impl(.x, .f, ..., .init = .init, .dir = .dir)
 21. │   └─purrr:::reduce_init(.x, .init, left = left, error_call = .purrr_error_call)
 22. │     └─rlang::is_empty(x)
 23. ├─purrr::map(...)
 24. │ └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
 25. │   ├─purrr:::with_indexed_errors(...)
 26. │   │ └─base::withCallingHandlers(...)
 27. │   ├─purrr:::call_with_cleanup(...)
 28. │   └─probably (local) .f(.x[[i]], ...)
 29. │     └─probably:::apply_interval_column(...)
 30. │       └─estimates %>% purrr::transpose() %>% ...
 31. ├─purrr::imap(...)
 32. │ └─purrr::map2(.x, vec_index(.x), .f, ...)
 33. │   └─purrr:::map2_("list", .x, .y, .f, ..., .progress = .progress)
 34. │     └─purrr:::vctrs_vec_compat(.x, .purrr_user_env)
 35. └─purrr::transpose(.)

From here:

https://github.com/tidymodels/probably/blob/ab2239dc332a91ba88a32889c422a93eda029c8e/R/cal-apply-impl.R#L26

But also used here:

https://github.com/tidymodels/probably/blob/ab2239dc332a91ba88a32889c422a93eda029c8e/R/cal-plot-utils.R#L156

simonpcouch avatar Sep 24 '24 14:09 simonpcouch