Skip to content

Commit 8aa9d2d

Browse files
authored
use pillar::type_sum rather than tibble::type_sum (#750)
1 parent cf06205 commit 8aa9d2d

File tree

3 files changed

+4
-2
lines changed

3 files changed

+4
-2
lines changed

DESCRIPTION

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff 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),

NAMESPACE

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -313,6 +313,7 @@ importFrom(hardhat,frequency_weights)
313313
importFrom(hardhat,importance_weights)
314314
importFrom(hardhat,tune)
315315
importFrom(magrittr,"%>%")
316+
importFrom(pillar,type_sum)
316317
importFrom(purrr,"%||%")
317318
importFrom(purrr,as_vector)
318319
importFrom(purrr,imap)
@@ -366,7 +367,6 @@ importFrom(stats,update)
366367
importFrom(tibble,as_tibble)
367368
importFrom(tibble,is_tibble)
368369
importFrom(tibble,tibble)
369-
importFrom(tibble,type_sum)
370370
importFrom(tidyr,gather)
371371
importFrom(utils,capture.output)
372372
importFrom(utils,getFromNamespace)

R/parsnip-package.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -12,6 +12,7 @@
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
@@ -21,7 +22,7 @@
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

0 commit comments

Comments
 (0)