Skip to content

Commit

Permalink
Merge pull request #858 from tidyverse/f-size-sum
Browse files Browse the repository at this point in the history
- Reexport `size_sum()` (#850, @topepo).
  • Loading branch information
krlmlr committed Feb 23, 2021
2 parents 0aaa867 + a3ff91c commit c14b70d
Show file tree
Hide file tree
Showing 4 changed files with 11 additions and 2 deletions.
4 changes: 3 additions & 1 deletion DESCRIPTION
Expand Up @@ -37,7 +37,7 @@ Imports:
lifecycle (>= 0.2.0),
magrittr,
methods,
pillar (>= 1.4.3),
pillar (>= 1.5.0),
pkgconfig,
rlang (>= 0.4.3),
utils,
Expand Down Expand Up @@ -73,3 +73,5 @@ RoxygenNote: 7.1.1.9001
Config/testthat/edition: 3
Config/testthat/parallel: true
Config/testthat/start-first: subsetting, as_tibble, add
Remotes:
r-lib/pillar@v1.5.0
2 changes: 2 additions & 0 deletions NAMESPACE
Expand Up @@ -58,6 +58,7 @@ export(repair_names)
export(rowid_to_column)
export(rownames_to_column)
export(set_tidy_names)
export(size_sum)
export(tbl_sum)
export(tibble)
export(tibble_)
Expand All @@ -77,6 +78,7 @@ importFrom(methods,setOldClass)
importFrom(pillar,new_pillar_title)
importFrom(pillar,new_pillar_type)
importFrom(pillar,obj_sum)
importFrom(pillar,size_sum)
importFrom(pillar,style_subtle)
importFrom(pillar,type_sum)
importFrom(pkgconfig,set_config)
Expand Down
4 changes: 4 additions & 0 deletions R/tbl_sum.R
Expand Up @@ -48,6 +48,10 @@ pillar::obj_sum
#' @export
pillar::type_sum

#' @importFrom pillar size_sum
#' @export
pillar::size_sum

#' @export
vec_ptype_abbr.tbl_df <- function(x, ...) {
abbr <- class(x)[[1]]
Expand Down
3 changes: 2 additions & 1 deletion man/reexports.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit c14b70d

Please sign in to comment.