From f0036e078d564caef8f11780f1eab27c91eb3c26 Mon Sep 17 00:00:00 2001 From: Lionel Henry Date: Mon, 6 Jun 2022 14:35:59 +0200 Subject: [PATCH] Import ellipsis from rlang --- DESCRIPTION | 3 +-- NAMESPACE | 1 - R/ctl_new_pillar.R | 2 +- R/ctl_pillar.R | 2 +- R/ctl_pillar_component.R | 2 +- R/glimpse.R | 2 +- R/multi.R | 4 ++-- R/shaft-.R | 2 +- R/tbl-format-body.R | 2 +- R/title.R | 2 +- R/type.R | 4 ++-- R/zzz.R | 1 - 12 files changed, 12 insertions(+), 15 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 4df36b9f5..17e0e0802 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -20,11 +20,10 @@ BugReports: https://github.com/r-lib/pillar/issues Imports: cli (>= 2.3.0), crayon (>= 1.3.4), - ellipsis (>= 0.3.2), fansi, glue, lifecycle, - rlang (>= 1.0.1), + rlang (>= 1.0.2), utf8 (>= 1.1.0), utils, vctrs (>= 0.3.8) diff --git a/NAMESPACE b/NAMESPACE index 1749a0302..635ca6dfa 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -155,7 +155,6 @@ export(tbl_format_header) export(tbl_format_setup) export(tbl_sum) export(type_sum) -import(ellipsis) import(lifecycle) import(rlang) importFrom(crayon,black) diff --git a/R/ctl_new_pillar.R b/R/ctl_new_pillar.R index 30df7d5cb..2187082d1 100644 --- a/R/ctl_new_pillar.R +++ b/R/ctl_new_pillar.R @@ -25,7 +25,7 @@ #' Implementations should return `NULL` if none of the data #' fits the available width. #' -#' @inheritParams ellipsis::dots_empty +#' @inheritParams rlang::args_dots_empty #' @param controller The object of class `"tbl"` currently printed. #' @param x A simple (one-dimensional) vector. #' @param width The available width, can be a vector for multiple tiers. diff --git a/R/ctl_pillar.R b/R/ctl_pillar.R index 3398fb8a2..fcf3a078b 100644 --- a/R/ctl_pillar.R +++ b/R/ctl_pillar.R @@ -123,7 +123,7 @@ pillar_from_shaft <- function(title, type, data, width) { #' If your tibble subclass needs more or different components in its pillars, #' override or extend [ctl_new_pillar()] and perhaps [ctl_new_pillar_list()]. #' -#' @inheritParams ellipsis::dots_empty +#' @inheritParams rlang::args_dots_empty #' @inheritParams pillar #' @param components A named list of components constructed with [pillar_component()]. #' @param class Name of subclass. diff --git a/R/ctl_pillar_component.R b/R/ctl_pillar_component.R index 154b6bbb2..17ebe51c1 100644 --- a/R/ctl_pillar_component.R +++ b/R/ctl_pillar_component.R @@ -17,7 +17,7 @@ #' Compound columns are represented by multiple pillar objects, each with their #' own components. #' -#' @inheritParams ellipsis::dots_empty +#' @inheritParams rlang::args_dots_empty #' @param x A bare list of length one (for `new_pillar_component()`), #' or an object with `"width"` and `"min_width"` attributes #' (for `pillar_component()`). diff --git a/R/glimpse.R b/R/glimpse.R index 38f5a0a3e..bcbd6ecf0 100644 --- a/R/glimpse.R +++ b/R/glimpse.R @@ -100,7 +100,7 @@ glimpse.default <- function(x, width = NULL, max.level = 3, ...) { #' Empty vectors are shown as `<>`. #' #' @return A character vector of the same length as `x`. -#' @inheritParams ellipsis::dots_used +#' @inheritParams rlang::args_dots_used #' @param x A vector. #' @export #' @examples diff --git a/R/multi.R b/R/multi.R index 66d7f1df6..ea54ddd07 100644 --- a/R/multi.R +++ b/R/multi.R @@ -14,7 +14,7 @@ #' @param has_row_id Include a column indicating row IDs? Pass `"*"` to mark #' the row ID column with a star. #' @param width Default width of the entire output, optional. -#' @inheritParams ellipsis::dots_empty +#' @inheritParams rlang::args_dots_empty #' @keywords internal #' @export colonnade <- function(x, has_row_id = TRUE, width = NULL, ...) { @@ -228,7 +228,7 @@ knit_print_squeezed_colonnade_tier <- function(x) { #' describes each of the omitted columns. #' #' @param x The result of [squeeze()] on a [colonnade] object -#' @inheritParams ellipsis::dots_used +#' @inheritParams rlang::args_dots_used #' @keywords internal #' @export extra_cols <- function(x, ...) { diff --git a/R/shaft-.R b/R/shaft-.R index d8ff21028..29c2f9223 100644 --- a/R/shaft-.R +++ b/R/shaft-.R @@ -61,7 +61,7 @@ new_pillar_shaft <- function(x, ..., width = NULL, min_width = width, #' for your data type to display it in a tibble. #' #' @param x A vector to format -#' @inheritParams ellipsis::dots_used +#' @inheritParams rlang::args_dots_used #' @export #' @examples #' pillar_shaft(1:3) diff --git a/R/tbl-format-body.R b/R/tbl-format-body.R index 253857021..53b9fc312 100644 --- a/R/tbl-format-body.R +++ b/R/tbl-format-body.R @@ -13,7 +13,7 @@ #' If you only need to change the appearance of a single data type, #' override [vctrs::vec_ptype_abbr()] and [pillar_shaft()] for this data type. #' -#' @inheritParams ellipsis::dots_empty +#' @inheritParams rlang::args_dots_empty #' @param x A tibble-like object. #' @param setup A setup object returned from [tbl_format_setup()]. #' diff --git a/R/title.R b/R/title.R index 079427c77..70e363a44 100644 --- a/R/title.R +++ b/R/title.R @@ -5,7 +5,7 @@ style_title <- style_bold #' Call [format()] on the result to render column titles. #' #' @param x A character vector of column titles. -#' @inheritParams ellipsis::dots_empty +#' @inheritParams rlang::args_dots_empty #' @export #' @examples #' format(new_pillar_title(names(trees))) diff --git a/R/type.R b/R/type.R index 86556888e..656d9d8a3 100644 --- a/R/type.R +++ b/R/type.R @@ -12,7 +12,7 @@ style_type <- function(x) { #' Call [format()] on the result to render column types. #' #' @param x A vector for which the type is to be retrieved. -#' @inheritParams ellipsis::dots_empty +#' @inheritParams rlang::args_dots_empty #' @export #' @examples #' format(new_pillar_type("a")) @@ -71,7 +71,7 @@ format_full_pillar_type <- function(x) { #' @param x A return value from `type_sum()` #' @param width The desired total width. If the returned string still is #' wider, it will be trimmed. Can be `NULL`. -#' @inheritParams ellipsis::dots_used +#' @inheritParams rlang::args_dots_used #' #' @export #' @examples diff --git a/R/zzz.R b/R/zzz.R index 5bf6a68b9..c39b1ae8c 100644 --- a/R/zzz.R +++ b/R/zzz.R @@ -1,7 +1,6 @@ # nocov start - zzz.R #' @import rlang -#' @import ellipsis #' @import lifecycle #' @importFrom glue as_glue #' @importFrom vctrs data_frame