File tree Expand file tree Collapse file tree 3 files changed +4
-2
lines changed Expand file tree Collapse file tree 3 files changed +4
-2
lines changed Original file line number Diff line number Diff line change @@ -28,6 +28,7 @@ Imports:
2828 hardhat (>= 1.1.0),
2929 lifecycle,
3030 magrittr,
31+ pillar,
3132 prettyunits,
3233 purrr,
3334 rlang (>= 0.3.1),
Original file line number Diff line number Diff line change @@ -313,6 +313,7 @@ importFrom(hardhat,frequency_weights)
313313importFrom(hardhat,importance_weights)
314314importFrom(hardhat,tune)
315315importFrom(magrittr,"%>%")
316+ importFrom(pillar,type_sum)
316317importFrom(purrr,"%||%")
317318importFrom(purrr,as_vector)
318319importFrom(purrr,imap)
@@ -366,7 +367,6 @@ importFrom(stats,update)
366367importFrom(tibble,as_tibble)
367368importFrom(tibble,is_tibble)
368369importFrom(tibble,tibble)
369- importFrom(tibble,type_sum)
370370importFrom(tidyr,gather)
371371importFrom(utils,capture.output)
372372importFrom(utils,getFromNamespace)
Original file line number Diff line number Diff line change 1212# ' @importFrom dplyr mutate pull rename select starts_with summarise tally
1313# ' @importFrom generics varying_args
1414# ' @importFrom glue glue_collapse
15+ # ' @importFrom pillar type_sum
1516# ' @importFrom purrr as_vector imap imap_lgl map map_chr map_dbl map_df map_dfr
1617# ' @importFrom purrr map_lgl %||%
1718# ' @importFrom rlang abort call2 caller_env current_env enquo enquos eval_tidy
2122# ' @importFrom stats delete.response model.frame model.matrix model.offset
2223# ' @importFrom stats model.response model.weights na.omit na.pass predict qnorm
2324# ' @importFrom stats qt quantile setNames terms update
24- # ' @importFrom tibble as_tibble is_tibble tibble type_sum
25+ # ' @importFrom tibble as_tibble is_tibble tibble
2526# ' @importFrom tidyr gather
2627# ' @importFrom utils capture.output getFromNamespace globalVariables head
2728# ' @importFrom utils methods stack
You can’t perform that action at this time.
0 commit comments