From 37bb2ef0be5c7b32b0c7668a49215b561f2a6092 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Sun, 12 Mar 2023 11:27:59 +0100 Subject: [PATCH 1/4] Hard-deprecate old API --- R/multi.R | 6 +++--- R/shaft-.R | 2 +- R/tbl-format.R | 4 ++-- 3 files changed, 6 insertions(+), 6 deletions(-) diff --git a/R/multi.R b/R/multi.R index d7a29d0be..2f74ca955 100644 --- a/R/multi.R +++ b/R/multi.R @@ -20,7 +20,7 @@ #' @keywords internal #' @export colonnade <- function(x, has_row_id = TRUE, width = NULL, ...) { - deprecate_soft("1.7.0", "pillar::colonnade()", "pillar::tbl_format_setup()") + deprecate_stop("1.9.0", "pillar::colonnade()", "pillar::tbl_format_setup()") if (!missing(...)) { check_dots_empty(action = warn) @@ -120,7 +120,7 @@ new_empty_col_sentinel <- function(type) { #' @keywords internal #' @export squeeze <- function(x, width = NULL, ...) { - deprecate_soft("1.5.0", "pillar::squeeze()") + deprecate_stop("1.5.0", "pillar::squeeze()") squeeze_impl(x, width, ...) } @@ -240,7 +240,7 @@ knit_print_squeezed_colonnade_tier <- function(x) { #' @keywords internal #' @export extra_cols <- function(x, ...) { - deprecate_soft("1.5.0", "pillar::extra_cols()") + deprecate_stop("1.5.0", "pillar::extra_cols()") if (!missing(...)) { check_dots_used(action = warn) diff --git a/R/shaft-.R b/R/shaft-.R index 4fa8e8046..c7ee8fceb 100644 --- a/R/shaft-.R +++ b/R/shaft-.R @@ -35,7 +35,7 @@ new_pillar_shaft <- function(x, ..., width = NULL, min_width = width, type_sum = NULL, class = NULL, subclass = NULL) { if (!is.null(subclass)) { - deprecate_soft("1.4.0", "pillar::new_pillar_shaft(subclass = )", "new_pillar_shaft(class = )") + deprecate_stop("1.4.0", "pillar::new_pillar_shaft(subclass = )", "new_pillar_shaft(class = )") class <- subclass } diff --git a/R/tbl-format.R b/R/tbl-format.R index ff147dda6..7fcf3db8d 100644 --- a/R/tbl-format.R +++ b/R/tbl-format.R @@ -17,7 +17,7 @@ print_tbl <- function(x, width = NULL, ..., n_extra = NULL, n = NULL, max_extra_cols = NULL, max_footer_lines = NULL) { if (!is.null(n_extra)) { - deprecate_soft( + deprecate_stop( "1.6.2", "pillar::print(n_extra = )", "pillar::print(max_extra_cols = )", user_env = caller_env(2) ) @@ -50,7 +50,7 @@ format_tbl <- function(x, width = NULL, ..., check_dots_empty(action = signal) if (!is.null(n_extra)) { - deprecate_soft( + deprecate_stop( "1.6.2", "pillar::format(n_extra = )", "pillar::format(max_extra_cols = )", user_env = caller_env(2) ) From 46b54e18edd2bb1658aadc151c100c9d53d4b8d9 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Sun, 12 Mar 2023 11:38:24 +0100 Subject: [PATCH 2/4] Adapt tests --- tests/testthat/_snaps/tbl-format.md | 6 +- tests/testthat/test-format_multi.R | 286 --------------------- tests/testthat/test-format_multi_fuzz.R | 41 --- tests/testthat/test-format_multi_fuzz_2.R | 39 --- tests/testthat/test-tbl-format.R | 2 +- tests/testthat/test-zzx-format_character.R | 83 ------ 6 files changed, 2 insertions(+), 455 deletions(-) delete mode 100644 tests/testthat/test-format_multi.R delete mode 100644 tests/testthat/test-format_multi_fuzz.R delete mode 100644 tests/testthat/test-format_multi_fuzz_2.R delete mode 100644 tests/testthat/test-zzx-format_character.R diff --git a/tests/testthat/_snaps/tbl-format.md b/tests/testthat/_snaps/tbl-format.md index ed6ff69d2..901a45ec2 100644 --- a/tests/testthat/_snaps/tbl-format.md +++ b/tests/testthat/_snaps/tbl-format.md @@ -233,11 +233,7 @@ --- Code - print(as_tbl(mtcars), width = 40, n_extra = 1) - Condition - Warning: - The `n_extra` argument of `print()` is deprecated as of pillar 1.6.2. - i Please use the `max_extra_cols` argument instead. + print(as_tbl(mtcars), width = 40, max_extra_cols = 1) Output # A data frame: 32 x 11 mpg cyl disp hp drat wt diff --git a/tests/testthat/test-format_multi.R b/tests/testthat/test-format_multi.R deleted file mode 100644 index a6b173052..000000000 --- a/tests/testthat/test-format_multi.R +++ /dev/null @@ -1,286 +0,0 @@ -test_that("sanity check (1)", { - expect_equal(cli::num_ansi_colors(), 1) - expect_false(has_color()) - expect_equal(num_colors(), 1) - - expect_snapshot({ - cli::num_ansi_colors() - has_color() - num_colors() - style_na("NA") - }) -}) - -test_that("output test", { - skip_if(getRversion() < "4.0") - - x <- list( - column_zero_one = 1:3 + 0.23, - col_02 = letters[1:3], - col_03 = factor(letters[1:3]), - col_04 = ordered(letters[1:3]) - ) - expect_snapshot({ - colonnade(x, width = 4) - colonnade(x, width = 5) - colonnade(x, width = 6) - colonnade(x, width = 7) - colonnade(x, width = 8) - colonnade(x, width = 9) - colonnade(x, width = 10) - colonnade(x, width = 11) - colonnade(x, width = 12) - colonnade(x, width = 13) - colonnade(x, width = 14) - colonnade(x, width = 15) - colonnade(x, width = 16) - colonnade(x, width = 17) - colonnade(x, width = 18) - colonnade(x, width = 19) - colonnade(x, width = 20) - colonnade(x, width = 21) - colonnade(x, width = 22) - colonnade(x, width = 23) - colonnade(x, width = 24) - colonnade(x, width = 25) - colonnade(x, width = 26) - colonnade(x, width = 27) - colonnade(x, width = 28) - colonnade(x, width = 29) - colonnade(x, width = 30) - colonnade(x, width = 31) - colonnade(x, width = 32) - colonnade(x, width = 33) - colonnade(x, width = 34) - colonnade(x, width = 35) - colonnade(x, width = 36) - colonnade(x, width = 37) - colonnade(x, width = 38) - colonnade(x, width = 39) - colonnade(x, width = Inf) - }) - - expect_snapshot({ - colonnade(rep(list(paste(letters, collapse = " ")), 4), width = Inf) - }) - - # Spurious warnings on Windows - suppressWarnings( - expect_snapshot({ - as_glue(extra_cols_impl(squeeze_impl(colonnade(x), width = 10))) - }) - ) - - suppressWarnings( - expect_snapshot({ - as_glue(extra_cols_impl(squeeze_impl(colonnade(x), width = 20))) - }) - ) - - suppressWarnings( - expect_snapshot({ - as_glue(extra_cols_impl(squeeze_impl(colonnade(x), width = 30))) - }) - ) - - suppressWarnings( - expect_snapshot({ - as_glue(extra_cols_impl(squeeze_impl(colonnade(x), width = 35))) - }) - ) - - expect_snapshot({ - as_glue(extra_cols_impl(squeeze_impl(colonnade(x), width = 40))) - }) -}) - -test_that("tests from tibble", { - skip_if(getRversion() < "4.0") - - skip_if_not_installed("rlang", "0.4.11.9000") - local_options(width = 80) - - expect_snapshot({ - colonnade(mtcars[1:8, ], has_row_id = "*", width = 30) - colonnade(trees[1:5, ], width = 20) - colonnade(trees[1:3, ], width = 10) - colonnade(df_all, width = 30) - colonnade(df_all, width = 300) - options(width = 70) - colonnade(df_all, width = 300) - options(width = 60) - colonnade(df_all, width = 300) - options(width = 50) - colonnade(df_all, width = 300) - options(width = 40) - colonnade(df_all, width = 300) - options(width = 30) - colonnade(df_all, width = 300) - options(width = 20) - colonnade(df_all, width = 300) - list_with_ctl <- list(c("\n", '"'), factor(c("\n", "\n"))) - names(list_with_ctl) <- c("\n", "\r") - colonnade(list_with_ctl, width = 30) - colonnade(list(a = c("", " ", "a ", " a")), width = 30) - colonnade(list("mean(x)" = 5, "var(x)" = 3), width = 30) - }) -}) - -test_that("empty", { - scoped_lifecycle_silence() - skip_if(getRversion() < "4.0") - - expect_equal( - format(colonnade(list(a = character(), b = logical()), width = 30)), - as_glue(character()) - ) - expect_equal( - format(colonnade(trees[1:5, character()], width = 30)), - as_glue(character()) - ) -}) - -test_that("NA names", { - skip_if(getRversion() < "4.0") - - x <- list(`NA` = 1:3, set_to_NA = 4:6) - names(x)[[2]] <- NA_character_ - expect_snapshot({ - colonnade(x, width = 30) - }) -}) - -test_that("sep argument", { - skip_if(getRversion() < "4.0") - - x <- list(sep = 1:3) - expect_snapshot({ - colonnade(x, width = 30) - "dummy" - }) -}) - -test_that("color", { - skip_if_not_installed("testthat", "3.1.1") - - local_colors() - expect_equal(cli::num_ansi_colors(), 16) - expect_true(has_color()) - expect_equal(num_colors(), 16) - - if (l10n_info()$`UTF-8`) { - local_utf8() - expect_true(cli::is_utf8_output()) - } - - expect_snapshot(variant = snapshot_variant("output-enc"), { - cli::num_ansi_colors() - has_color() - num_colors() - style_na("NA") - style_neg("-1") - }) - - with_lifecycle_silence({ - xf <- colonnade(list(x = c((10^(-3:4)) * c(-1, 1), NA))) - }) - - expect_snapshot(variant = snapshot_variant("output-enc"), { - print(xf) - with_options(pillar.subtle_num = TRUE, print(xf)) - with_options(pillar.subtle = FALSE, print(xf)) - with_options(pillar.neg = FALSE, print(xf)) - with_options(pillar.subtle = FALSE, pillar.neg = FALSE, print(xf)) - with_options(pillar.bold = TRUE, print(xf)) - }) - - skip_if(getRversion() < "4.0") - - expect_snapshot(variant = snapshot_variant("output-enc"), { - colonnade(list(a_very_long_column_name = 0), width = 15) - }) -}) - -test_that("sanity check (2)", { - expect_equal(cli::num_ansi_colors(), 1) - expect_false(has_color()) - expect_equal(num_colors(), 1) - - expect_snapshot({ - cli::num_ansi_colors() - has_color() - num_colors() - style_na("NA") - }) -}) - -test_that("tibble columns", { - skip_if(getRversion() < "4.0") - - x <- list(a = 1:3, b = data.frame(c = 4:6, d = 7:9)) - expect_snapshot({ - colonnade(x, width = 30) - }) -}) - -test_that("tibble columns (nested)", { - skip_if(getRversion() < "4.0") - - x <- list( - a = 1:3, - b = structure( - list( - c = 4:6, d = 7:9, - e = data.frame(f = 10:12, g = 13:15) - ), - class = "data.frame" - ) - ) - expect_snapshot({ - colonnade(x, width = 40) - }) -}) - -test_that("tibble columns (empty)", { - skip_if(getRversion() < "4.0") - - x <- list( - a = 1:3, - b = structure( - list( - c = 4:6, d = 7:9, - e = data.frame(f = 10:12)[, 0], - f = 10:12 - ), - class = "data.frame" - ) - ) - expect_snapshot({ - colonnade(x, width = 40) - }) -}) - -test_that("matrix columns (unnamed)", { - skip_if(getRversion() < "4.0") - - x <- list(a = 1:3, b = matrix(4:9, ncol = 2)) - expect_snapshot({ - colonnade(x, width = 30) - }) -}) - -test_that("matrix columns (named)", { - skip_if(getRversion() < "4.0") - - x <- list(a = 1:3, b = matrix(4:9, ncol = 2, dimnames = list(NULL, c("c", "d")))) - expect_snapshot({ - colonnade(x, width = 30) - }) -}) - -test_that("matrix columns (empty)", { - x <- list(a = 1:3, b = matrix(4:6, ncol = 1)[, 0], c = 4:6) - expect_snapshot({ - colonnade(x, width = 30) - }) -}) diff --git a/tests/testthat/test-format_multi_fuzz.R b/tests/testthat/test-format_multi_fuzz.R deleted file mode 100644 index c54945952..000000000 --- a/tests/testthat/test-format_multi_fuzz.R +++ /dev/null @@ -1,41 +0,0 @@ -test_that("strings with varying widths", { - skip_if(getRversion() < "4.0") - - local_options(width = 80) - - # Generated by data-raw/create-chr-tests.R - # nolint start - expect_snapshot({ - options(width = 59) - colonnade(df_str[c(12L, 33L, 36L, 7L, 41L, 3L, 18L, 23L, 13L, 44L, 14L, 16L, 25L, 21L, 19L, 45L, 43L, 29L, 1L, 30L, 22L, 27L, 15L, 47L, 28L, 31L, 10L, 50L, 4L, 40L, 42L, 8L, 6L, 9L, 24L, 48L, 38L, 37L, 34L, 49L, 46L, 2L, 32L, 35L, 39L, 11L, 17L, 5L, 26L, 20L)], width = 1382) - options(width = 54) - colonnade(df_str[c(40L, 28L, 7L, 16L, 48L, 6L, 21L, 1L, 20L, 17L, 47L, 45L, 29L, 41L, 49L, 34L, 4L, 39L, 18L, 36L, 26L, 38L, 10L, 8L, 5L, 15L, 44L, 24L, 46L, 14L, 25L, 27L, 3L, 37L, 35L, 12L, 9L, 13L, 22L, 33L, 42L, 11L, 19L, 50L, 23L, 30L, 32L, 2L, 43L, 31L)], width = 837) - options(width = 32) - colonnade(df_str[c(47L, 42L, 4L, 46L, 9L, 34L, 19L, 39L, 8L, 32L, 36L, 12L, 29L, 5L, 15L, 11L, 31L, 27L, 33L, 28L, 43L, 6L, 13L, 22L, 14L, 16L, 35L, 50L, 38L, 7L, 23L, 45L, 40L, 3L, 2L, 24L, 41L, 10L, 30L, 25L, 17L, 26L, 48L, 37L, 49L, 1L, 18L, 21L, 44L, 20L)], width = 455) - options(width = 55) - colonnade(df_str[c(41L, 4L, 25L, 31L, 8L, 22L, 19L, 10L, 29L, 21L, 34L, 5L, 26L, 36L, 47L, 46L, 2L, 24L, 27L, 39L, 28L, 43L, 32L, 30L, 48L, 44L, 6L, 20L, 13L, 15L, 18L, 42L, 9L, 12L, 37L, 45L, 16L, 40L, 11L, 14L, 38L, 1L, 7L, 3L, 23L, 35L, 50L, 17L, 49L, 33L)], width = 855) - options(width = 54) - colonnade(df_str[c(27L, 22L, 9L, 23L, 16L, 19L, 25L, 31L, 44L, 1L, 28L, 46L, 12L, 20L, 43L, 37L, 5L, 2L, 18L, 41L, 26L, 33L, 11L, 49L, 24L, 35L, 4L, 47L, 30L, 7L, 34L, 3L, 32L, 42L, 10L, 45L, 38L, 39L, 48L, 14L, 6L, 17L, 36L, 50L, 40L, 13L, 8L, 21L, 15L, 29L)], width = 552) - options(width = 49) - colonnade(df_str[c(32L, 24L, 18L, 25L, 26L, 13L, 33L, 2L, 50L, 38L, 37L, 16L, 27L, 9L, 28L, 49L, 34L, 15L, 17L, 35L, 22L, 47L, 3L, 21L, 23L, 41L, 5L, 1L, 14L, 46L, 30L, 31L, 44L, 4L, 7L, 40L, 43L, 12L, 29L, 8L, 36L, 45L, 11L, 20L, 10L, 6L, 19L, 48L, 39L, 42L)], width = 1031) - options(width = 38) - colonnade(df_str[c(44L, 34L, 49L, 9L, 15L, 16L, 1L, 10L, 40L, 29L, 26L, 22L, 4L, 43L, 20L, 17L, 46L, 33L, 35L, 32L, 2L, 12L, 8L, 37L, 23L, 39L, 7L, 18L, 36L, 42L, 6L, 30L, 19L, 25L, 5L, 21L, 47L, 50L, 28L, 11L, 31L, 14L, 24L, 27L, 45L, 41L, 38L, 3L, 13L, 48L)], width = 429) - options(width = 54) - colonnade(df_str[c(21L, 26L, 8L, 22L, 41L, 24L, 13L, 5L, 47L, 37L, 4L, 42L, 19L, 34L, 11L, 43L, 38L, 3L, 33L, 20L, 31L, 2L, 18L, 48L, 27L, 44L, 9L, 35L, 30L, 6L, 49L, 10L, 1L, 16L, 46L, 29L, 12L, 14L, 45L, 36L, 15L, 39L, 50L, 23L, 17L, 28L, 7L, 32L, 40L, 25L)], width = 633) - options(width = 39) - colonnade(df_str[c(23L, 49L, 13L, 37L, 3L, 25L, 36L, 4L, 9L, 7L, 27L, 48L, 12L, 10L, 50L, 14L, 38L, 39L, 46L, 22L, 28L, 8L, 21L, 44L, 32L, 40L, 31L, 1L, 29L, 34L, 35L, 33L, 19L, 15L, 41L, 20L, 47L, 18L, 16L, 45L, 6L, 5L, 24L, 26L, 43L, 11L, 42L, 30L, 17L, 2L)], width = 1496) - options(width = 31) - colonnade(df_str[c(45L, 14L, 49L, 24L, 22L, 31L, 42L, 18L, 16L, 47L, 25L, 4L, 37L, 8L, 26L, 21L, 50L, 5L, 41L, 30L, 2L, 33L, 34L, 3L, 44L, 19L, 43L, 6L, 32L, 29L, 20L, 1L, 13L, 11L, 40L, 12L, 48L, 23L, 9L, 15L, 46L, 36L, 27L, 35L, 28L, 10L, 7L, 39L, 17L, 38L)], width = 493) - options(width = 52) - colonnade(df_str[c(38L, 46L, 17L, 11L, 24L, 18L, 16L, 39L, 50L, 42L, 6L, 13L, 37L, 29L, 41L, 47L, 9L, 33L, 44L, 31L, 45L, 36L, 28L, 5L, 10L, 30L, 20L, 1L, 14L, 43L, 49L, 23L, 26L, 21L, 32L, 19L, 34L, 15L, 48L, 4L, 7L, 35L, 40L, 8L, 22L, 3L, 25L, 12L, 27L, 2L)], width = 1130) - options(width = 58) - colonnade(df_str[c(17L, 28L, 29L, 27L, 20L, 31L, 43L, 30L, 32L, 48L, 10L, 50L, 13L, 12L, 36L, 21L, 46L, 33L, 25L, 35L, 1L, 5L, 16L, 34L, 18L, 42L, 3L, 11L, 40L, 26L, 37L, 7L, 39L, 6L, 4L, 19L, 8L, 45L, 14L, 24L, 23L, 2L, 47L, 9L, 49L, 41L, 38L, 22L, 44L, 15L)], width = 1310) - options(width = 47) - colonnade(df_str[c(1L, 26L, 20L, 12L, 49L, 16L, 24L, 4L, 15L, 47L, 8L, 11L, 14L, 50L, 17L, 2L, 44L, 30L, 36L, 45L, 25L, 38L, 18L, 29L, 5L, 13L, 3L, 23L, 48L, 40L, 34L, 22L, 39L, 33L, 27L, 7L, 19L, 10L, 37L, 6L, 35L, 46L, 31L, 41L, 43L, 28L, 42L, 32L, 21L, 9L)], width = 484) - options(width = 55) - colonnade(df_str[c(6L, 49L, 26L, 45L, 25L, 15L, 31L, 20L, 21L, 44L, 23L, 48L, 37L, 36L, 5L, 43L, 11L, 14L, 13L, 39L, 16L, 12L, 4L, 18L, 42L, 3L, 10L, 28L, 40L, 24L, 29L, 17L, 35L, 47L, 2L, 38L, 34L, 9L, 7L, 8L, 50L, 33L, 32L, 27L, 46L, 19L, 22L, 41L, 30L, 1L)], width = 779) - options(width = 46) - colonnade(df_str[c(38L, 42L, 41L, 10L, 40L, 11L, 27L, 9L, 17L, 37L, 46L, 13L, 36L, 18L, 31L, 20L, 39L, 12L, 44L, 33L, 50L, 34L, 26L, 32L, 23L, 30L, 29L, 21L, 4L, 49L, 19L, 25L, 3L, 6L, 15L, 14L, 43L, 48L, 8L, 22L, 1L, 2L, 45L, 35L, 16L, 5L, 47L, 28L, 24L, 7L)], width = 694) - }) - # nolint end -}) diff --git a/tests/testthat/test-format_multi_fuzz_2.R b/tests/testthat/test-format_multi_fuzz_2.R deleted file mode 100644 index 01e9aa0a0..000000000 --- a/tests/testthat/test-format_multi_fuzz_2.R +++ /dev/null @@ -1,39 +0,0 @@ -test_that("strings with varying widths", { - local_options(width = 80) - - # Generated by data-raw/create-chr-tests.R - # nolint start - expect_snapshot({ - options(width = 54) - colonnade(df_str[c(28L, 34L, 16L, 29L, 47L, 25L, 42L, 27L, 44L, 20L, 14L, 36L, 43L, 41L, 26L, 45L, 22L, 9L, 13L, 32L, 31L, 12L, 19L, 48L, 49L, 35L, 3L, 11L, 23L, 24L, 40L, 15L, 38L, 10L, 46L, 5L, 50L, 18L, 21L, 6L, 30L, 2L, 7L, 1L, 4L, 8L, 17L, 33L, 39L, 37L)], width = 516) - options(width = 42) - colonnade(df_str[c(28L, 41L, 12L, 29L, 13L, 43L, 24L, 50L, 48L, 35L, 44L, 21L, 33L, 45L, 47L, 34L, 25L, 14L, 18L, 23L, 7L, 3L, 42L, 36L, 11L, 2L, 20L, 31L, 1L, 4L, 38L, 9L, 27L, 40L, 32L, 17L, 6L, 49L, 16L, 19L, 15L, 22L, 39L, 10L, 46L, 5L, 30L, 8L, 26L, 37L)], width = 1365) - options(width = 39) - colonnade(df_str[c(40L, 17L, 13L, 23L, 22L, 2L, 18L, 3L, 29L, 45L, 14L, 19L, 33L, 37L, 47L, 43L, 44L, 10L, 31L, 27L, 34L, 35L, 41L, 21L, 4L, 25L, 38L, 48L, 9L, 24L, 26L, 39L, 20L, 36L, 42L, 16L, 6L, 11L, 7L, 12L, 1L, 46L, 15L, 5L, 8L, 50L, 32L, 30L, 49L, 28L)], width = 934) - options(width = 32) - colonnade(df_str[c(11L, 36L, 17L, 14L, 31L, 35L, 23L, 13L, 6L, 44L, 45L, 22L, 21L, 18L, 33L, 10L, 43L, 2L, 46L, 34L, 3L, 19L, 1L, 38L, 9L, 37L, 5L, 8L, 25L, 49L, 27L, 29L, 15L, 39L, 24L, 40L, 48L, 26L, 47L, 42L, 41L, 12L, 28L, 30L, 7L, 16L, 4L, 50L, 20L, 32L)], width = 565) - options(width = 35) - colonnade(df_str[c(18L, 46L, 11L, 43L, 31L, 47L, 48L, 44L, 50L, 15L, 28L, 33L, 13L, 4L, 22L, 3L, 37L, 32L, 40L, 9L, 25L, 16L, 45L, 23L, 21L, 6L, 49L, 36L, 27L, 38L, 14L, 34L, 8L, 24L, 29L, 1L, 12L, 2L, 20L, 17L, 35L, 5L, 19L, 30L, 7L, 26L, 42L, 41L, 39L, 10L)], width = 1121) - options(width = 32) - colonnade(df_str[c(43L, 1L, 3L, 15L, 28L, 12L, 46L, 34L, 31L, 7L, 11L, 4L, 44L, 8L, 9L, 5L, 36L, 22L, 17L, 39L, 18L, 45L, 37L, 13L, 29L, 6L, 30L, 16L, 20L, 10L, 19L, 26L, 33L, 40L, 35L, 48L, 38L, 25L, 2L, 47L, 42L, 41L, 27L, 14L, 21L, 24L, 50L, 49L, 23L, 32L)], width = 446) - options(width = 31) - colonnade(df_str[c(37L, 46L, 21L, 3L, 16L, 39L, 34L, 33L, 10L, 17L, 19L, 36L, 45L, 49L, 11L, 50L, 14L, 29L, 44L, 13L, 30L, 38L, 32L, 40L, 42L, 1L, 31L, 41L, 7L, 23L, 35L, 28L, 6L, 25L, 2L, 9L, 12L, 15L, 5L, 18L, 20L, 27L, 43L, 8L, 47L, 4L, 48L, 24L, 26L, 22L)], width = 1166) - options(width = 58) - colonnade(df_str[c(31L, 39L, 40L, 30L, 10L, 21L, 9L, 16L, 46L, 25L, 15L, 24L, 3L, 50L, 35L, 1L, 12L, 34L, 48L, 4L, 29L, 23L, 37L, 36L, 28L, 43L, 11L, 17L, 32L, 8L, 41L, 13L, 44L, 7L, 38L, 26L, 33L, 20L, 19L, 2L, 18L, 49L, 27L, 47L, 22L, 14L, 6L, 5L, 45L, 42L)], width = 546) - options(width = 57) - colonnade(df_str[c(43L, 21L, 41L, 48L, 22L, 25L, 2L, 8L, 1L, 24L, 6L, 39L, 38L, 20L, 49L, 45L, 47L, 12L, 9L, 13L, 36L, 26L, 44L, 11L, 46L, 28L, 7L, 18L, 50L, 16L, 29L, 30L, 4L, 23L, 17L, 40L, 33L, 14L, 27L, 19L, 34L, 32L, 3L, 37L, 15L, 10L, 5L, 35L, 31L, 42L)], width = 1035) - options(width = 33) - colonnade(df_str[c(40L, 6L, 25L, 5L, 26L, 17L, 19L, 2L, 11L, 34L, 45L, 24L, 22L, 44L, 35L, 7L, 4L, 49L, 1L, 36L, 12L, 41L, 39L, 13L, 48L, 27L, 18L, 30L, 42L, 28L, 3L, 46L, 21L, 20L, 16L, 29L, 50L, 10L, 9L, 8L, 47L, 31L, 14L, 38L, 33L, 32L, 43L, 23L, 15L, 37L)], width = 1217) - options(width = 32) - colonnade(df_str[c(43L, 23L, 22L, 11L, 6L, 26L, 48L, 17L, 7L, 42L, 36L, 21L, 35L, 50L, 13L, 19L, 29L, 8L, 15L, 4L, 2L, 27L, 49L, 47L, 30L, 31L, 25L, 28L, 46L, 12L, 32L, 39L, 24L, 10L, 45L, 5L, 37L, 14L, 40L, 20L, 41L, 44L, 33L, 18L, 38L, 3L, 1L, 34L, 16L, 9L)], width = 770) - options(width = 46) - colonnade(df_str[c(5L, 24L, 43L, 46L, 35L, 39L, 18L, 26L, 8L, 27L, 2L, 50L, 6L, 14L, 29L, 47L, 9L, 16L, 36L, 4L, 13L, 41L, 3L, 28L, 37L, 33L, 38L, 31L, 34L, 19L, 42L, 32L, 1L, 45L, 15L, 7L, 11L, 49L, 23L, 12L, 48L, 20L, 21L, 44L, 25L, 10L, 22L, 30L, 40L, 17L)], width = 1439) - options(width = 52) - colonnade(df_str[c(7L, 44L, 19L, 21L, 18L, 35L, 23L, 50L, 33L, 37L, 25L, 26L, 10L, 39L, 2L, 47L, 42L, 14L, 9L, 41L, 45L, 6L, 4L, 11L, 24L, 43L, 32L, 3L, 38L, 5L, 49L, 27L, 17L, 8L, 22L, 40L, 12L, 15L, 1L, 28L, 31L, 29L, 13L, 48L, 34L, 36L, 30L, 20L, 16L, 46L)], width = 1065) - options(width = 35) - colonnade(df_str[c(38L, 18L, 23L, 36L, 35L, 20L, 44L, 19L, 13L, 41L, 31L, 7L, 11L, 29L, 2L, 14L, 26L, 46L, 40L, 45L, 9L, 34L, 33L, 22L, 1L, 17L, 28L, 10L, 21L, 30L, 47L, 49L, 6L, 12L, 4L, 25L, 32L, 15L, 43L, 24L, 48L, 3L, 37L, 50L, 42L, 39L, 16L, 8L, 27L, 5L)], width = 393) - options(width = 41) - colonnade(df_str[c(22L, 9L, 11L, 26L, 19L, 16L, 32L, 25L, 1L, 30L, 31L, 6L, 24L, 10L, 39L, 21L, 50L, 7L, 29L, 12L, 46L, 43L, 15L, 35L, 20L, 40L, 49L, 38L, 36L, 48L, 34L, 3L, 8L, 4L, 27L, 42L, 44L, 33L, 45L, 18L, 5L, 2L, 13L, 47L, 28L, 17L, 37L, 14L, 41L, 23L)], width = 999) - }) - # nolint end -}) diff --git a/tests/testthat/test-tbl-format.R b/tests/testthat/test-tbl-format.R index 528efde50..a36183aac 100644 --- a/tests/testthat/test-tbl-format.R +++ b/tests/testthat/test-tbl-format.R @@ -45,7 +45,7 @@ test_that("print() output", { }) expect_snapshot({ - print(as_tbl(mtcars), width = 40, n_extra = 1) + print(as_tbl(mtcars), width = 40, max_extra_cols = 1) print(tbl_format_setup(new_tbl(trees, pillar_focus = "Volume"), width = 30)) }) diff --git a/tests/testthat/test-zzx-format_character.R b/tests/testthat/test-zzx-format_character.R deleted file mode 100644 index c0fe78a0a..000000000 --- a/tests/testthat/test-zzx-format_character.R +++ /dev/null @@ -1,83 +0,0 @@ -chartype_frame <- function() { - chars <- character() - desc <- character() - - chars[1] <- "\u0001\u001f" - desc[1] <- "C0 control code" - - chars[2] <- "\a\b\f\n\r\t" - desc[2] <- "Named control code" - - chars[3] <- "abcdefuvwxyz" - desc[3] <- "ASCII" - - chars[4] <- "\u0080\u009f" - desc[4] <- "C1 control code" - - chars[5] <- paste0( - "\u00a0\u00a1\u00a2\u00a3\u00a4\u00a5", - "\u00fa\u00fb\u00fc\u00fd\u00fe\u00ff" - ) - desc[5] <- "Latin-1" - - chars[6] <- paste0( - "\u0100\u0101\u0102\u0103\u0104\u0105", - "\u0106\u0107\u0108\u0109\u010a\u010b" - ) - desc[6] <- "Unicode" - - chars[7] <- "\uff01\uff02\uff03\uff04\uff05\uff06" - desc[7] <- "Unicode wide" - - chars[8] <- "\ue00\u2029" - desc[8] <- "Unicode control" - - chars[9] <- paste0( - "x\u00adx\u200bx\u200cx\u200dx\u200ex\u200f", - "x\u034fx\ufeffx", intToUtf8(0xE0001), "x", - intToUtf8(0xE0020), "x", intToUtf8(0xE01EF), "x" - ) - desc[9] <- "Unicode ignorable" - - chars[10] <- paste0( - "a\u0300a\u0301a\u0302a\u0303a\u0304a\u0305", - "a\u0306a\u0307a\u0308a\u0309a\u030aa\u030b" - ) - desc[10] <- "Unicode mark" - - chars[11] <- paste0( - intToUtf8(0x1F600), intToUtf8(0x1F601), - intToUtf8(0x1F602), intToUtf8(0x1F603), - intToUtf8(0x1F604), intToUtf8(0x1F483) - ) - desc[11] <- "Emoji" - - chars[12] <- paste0("x", intToUtf8(0x10ffff), "x") - desc[12] <- "Unassigned" - - chars[13] <- "\xfd\xfe\xff" - desc[13] <- "Invalid" - - chars[14] <- "\\" - desc[14] <- "Backslash" - - chars[15] <- '"' - desc[15] <- "Quote" - - Encoding(chars) <- "UTF-8" - - data.frame(chars, desc, stringsAsFactors = FALSE) -} - -test_that("output test (not on Windows)", { - skip_if(getRversion() < "4.0") - skip_on_os("windows") - skip_if_not_installed("testthat", "1.3.3") - - # Spurious warnings on Windows - suppressWarnings( - expect_snapshot({ - colonnade(chartype_frame(), width = 50) - }) - ) -}) From e06f69cdd15e7f0f6e7652cc4320710b99ad1df0 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Sun, 12 Mar 2023 16:44:03 +0100 Subject: [PATCH 3/4] Problems --- revdep/README.md | 12 +++++-- revdep/cran.md | 13 +++++--- revdep/failures.md | 63 +++++++++++++++++++++++++++++++++++- revdep/problems.md | 80 +++++++++++++++++++++++++++++++++++++++------- 4 files changed, 148 insertions(+), 20 deletions(-) diff --git a/revdep/README.md b/revdep/README.md index c08f10ae3..8da62ac3d 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,8 +1,14 @@ # Revdeps +## Failed to check (1) + +|package |version |error |warning |note | +|:----------|:-------|:-----|:-------|:----| +|incidence2 |1.2.3 |1 | | | + ## New problems (1) -|package |version |error |warning |note | -|:----------------------------|:-------|:-----|:-------|:----| -|[RNeXML](problems.md#rnexml) |2.4.5 | |__+1__ | | +|package |version |error |warning |note | +|:-------|:-------|:------|:-------|:----| +|[prt](problems.md#prt)|0.1.5 |__+2__ |__+1__ | | diff --git a/revdep/cran.md b/revdep/cran.md index 4fcd9c045..f9b3f6301 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,15 +1,20 @@ ## revdepcheck results -We checked 3 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. +We checked 100 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. * We saw 1 new problems - * We failed to check 0 packages + * We failed to check 1 packages Issues with CRAN packages are summarised below. ### New problems (This reports the first line of each new failure) -* RNeXML - checking whether the namespace can be unloaded cleanly ... WARNING +* prt + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... WARNING +### Failed to check + +* incidence2 (NA) diff --git a/revdep/failures.md b/revdep/failures.md index 9a2073633..4097552ba 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1 +1,62 @@ -*Wow, no problems at all. :)* \ No newline at end of file +# incidence2 + +
+ +* Version: 1.2.3 +* GitHub: https://github.com/reconverse/incidence2 +* Source code: https://github.com/cran/incidence2 +* Date/Publication: 2021-11-07 22:00:02 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "incidence2")` for more info + +
+ +## In both + +* checking whether package ‘incidence2’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/incidence2/new/incidence2.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘incidence2’ ... +** package ‘incidence2’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error : The `x` argument of `as_tibble()` can't be missing as of tibble 3.0.0. +Error: unable to load R code in package ‘incidence2’ +Execution halted +ERROR: lazy loading failed for package ‘incidence2’ +* removing ‘/tmp/workdir/incidence2/new/incidence2.Rcheck/incidence2’ + + +``` +### CRAN + +``` +* installing *source* package ‘incidence2’ ... +** package ‘incidence2’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error : The `x` argument of `as_tibble()` can't be missing as of tibble 3.0.0. +Error: unable to load R code in package ‘incidence2’ +Execution halted +ERROR: lazy loading failed for package ‘incidence2’ +* removing ‘/tmp/workdir/incidence2/old/incidence2.Rcheck/incidence2’ + + +``` diff --git a/revdep/problems.md b/revdep/problems.md index e1f22a2c9..db8ee8a0a 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -1,25 +1,81 @@ -# RNeXML +# prt
-* Version: 2.4.5 -* GitHub: https://github.com/ropensci/RNeXML -* Source code: https://github.com/cran/RNeXML -* Date/Publication: 2020-06-18 18:40:02 UTC -* Number of recursive dependencies: 141 +* Version: 0.1.5 +* GitHub: https://github.com/nbenn/prt +* Source code: https://github.com/cran/prt +* Date/Publication: 2022-07-18 09:40:02 UTC +* Number of recursive dependencies: 67 -Run `cloud_details(, "RNeXML")` for more info +Run `revdepcheck::cloud_details(, "prt")` for more info
## Newly broken -* checking whether the namespace can be unloaded cleanly ... WARNING +* checking examples ... ERROR ``` - ---- unloading - Error in .mergeMethodsTable(generic, mtable, tt, attach) : - trying to get slot "defined" from an object of a basic class ("environment") with no slots - Calls: unloadNamespace ... -> .updateMethodsInTable -> .mergeMethodsTable + Running examples in ‘prt-Ex.R’ failed + The error most likely occurred in: + + > ### Name: print.prt + > ### Title: Printing prt + > ### Aliases: print.prt format.prt trunc_dt + > + > ### ** Examples + > + > cars <- as_prt(mtcars) + ... + 9. ├─base::format(x, ..., n = n, width = width, max_extra_cols = max_extra_cols) + 10. └─prt:::format.prt(x, ..., n = n, width = width, max_extra_cols = max_extra_cols) + 11. ├─base::format(trunc_dt(x, n = n, width = width, max_extra_cols = max_extra_cols)) + 12. └─prt::trunc_dt(x, n = n, width = width, max_extra_cols = max_extra_cols) + 13. └─prt:::shrink_dt(df, rows) + 14. └─pillar::colonnade(df, has_row_id = FALSE) + 15. └─lifecycle::deprecate_stop("1.9.0", "pillar::colonnade()", "pillar::tbl_format_setup()") + 16. └─lifecycle:::deprecate_stop0(msg) + 17. └─rlang::cnd_signal(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 16. │ │ └─base::is.factor(x) + 17. │ └─base::paste0(...) + 18. ├─base::format(x, ..., n = n, width = width, max_extra_cols = max_extra_cols) + 19. └─prt:::format.prt(x, ..., n = n, width = width, max_extra_cols = max_extra_cols) + 20. ├─base::format(trunc_dt(x, n = n, width = width, max_extra_cols = max_extra_cols)) + 21. └─prt::trunc_dt(x, n = n, width = width, max_extra_cols = max_extra_cols) + 22. └─prt:::shrink_dt(df, rows) + 23. └─pillar::colonnade(df, has_row_id = FALSE) + 24. └─lifecycle::deprecate_stop("1.9.0", "pillar::colonnade()", "pillar::tbl_format_setup()") + 25. └─lifecycle:::deprecate_stop0(msg) + 26. └─rlang::cnd_signal(...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 257 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘prt.Rmd’ using rmarkdown + Quitting from lines 35-37 (prt.Rmd) + Error: processing vignette 'prt.Rmd' failed with diagnostics: + `colonnade()` was deprecated in pillar 1.9.0 and is now defunct. + ℹ Please use `tbl_format_setup()` instead. + --- failed re-building ‘prt.Rmd’ + + SUMMARY: processing the following file failed: + ‘prt.Rmd’ + + Error: Vignette re-building failed. Execution halted ``` From 14413423970af1f7df780a0f2affcf11a2b7b4f5 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Sun, 12 Mar 2023 16:47:40 +0100 Subject: [PATCH 4/4] Remove user_env argument --- R/tbl-format.R | 10 ++-------- 1 file changed, 2 insertions(+), 8 deletions(-) diff --git a/R/tbl-format.R b/R/tbl-format.R index 7fcf3db8d..005636f2c 100644 --- a/R/tbl-format.R +++ b/R/tbl-format.R @@ -17,10 +17,7 @@ print_tbl <- function(x, width = NULL, ..., n_extra = NULL, n = NULL, max_extra_cols = NULL, max_footer_lines = NULL) { if (!is.null(n_extra)) { - deprecate_stop( - "1.6.2", "pillar::print(n_extra = )", "pillar::print(max_extra_cols = )", - user_env = caller_env(2) - ) + deprecate_stop("1.6.2", "pillar::print(n_extra = )", "pillar::print(max_extra_cols = )") if (is.null(max_extra_cols)) { max_extra_cols <- n_extra } @@ -50,10 +47,7 @@ format_tbl <- function(x, width = NULL, ..., check_dots_empty(action = signal) if (!is.null(n_extra)) { - deprecate_stop( - "1.6.2", "pillar::format(n_extra = )", "pillar::format(max_extra_cols = )", - user_env = caller_env(2) - ) + deprecate_stop("1.6.2", "pillar::format(n_extra = )", "pillar::format(max_extra_cols = )") if (is.null(max_extra_cols)) { max_extra_cols <- n_extra }