Skip to content

Commit

Permalink
chore: Auto-update from GitHub Actions
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed Nov 22, 2024
1 parent 7db09f9 commit a03ab52
Show file tree
Hide file tree
Showing 4 changed files with 25 additions and 30 deletions.
1 change: 0 additions & 1 deletion .github/dep-suggests-matrix.json

This file was deleted.

1 change: 0 additions & 1 deletion .github/versions-matrix.json

This file was deleted.

38 changes: 18 additions & 20 deletions R/tbl-format-setup.R
Original file line number Diff line number Diff line change
Expand Up @@ -64,14 +64,13 @@
#' @examplesIf rlang::is_installed("palmerpenguins")
#' tbl_format_setup(palmerpenguins::penguins)
tbl_format_setup <- function(
x,
width = NULL,
...,
n = NULL,
max_extra_cols = NULL,
max_footer_lines = NULL,
focus = NULL
) {
x,
width = NULL,
...,
n = NULL,
max_extra_cols = NULL,
max_footer_lines = NULL,
focus = NULL) {
"!!!!DEBUG tbl_format_setup()"

width <- get_width_print(width)
Expand Down Expand Up @@ -231,18 +230,17 @@ tbl_nrow.tbl <- function(x, ...) {
#'
#' @keywords internal
new_tbl_format_setup <- function(
x,
df,
width,
tbl_sum,
body,
rows_missing,
rows_total,
extra_cols,
extra_cols_total,
max_footer_lines,
abbrev_cols
) {
x,
df,
width,
tbl_sum,
body,
rows_missing,
rows_total,
extra_cols,
extra_cols_total,
max_footer_lines,
abbrev_cols) {
trunc_info <- list(
x = x,
df = df,
Expand Down
15 changes: 7 additions & 8 deletions R/tbl-format.R
Original file line number Diff line number Diff line change
Expand Up @@ -42,14 +42,13 @@ format.tbl <- function(x, width = NULL, ...,
}

format_tbl <- function(
x,
width = NULL,
...,
n_extra = NULL,
n = NULL,
max_extra_cols = NULL,
max_footer_lines = NULL
) {
x,
width = NULL,
...,
n_extra = NULL,
n = NULL,
max_extra_cols = NULL,
max_footer_lines = NULL) {
check_dots_empty(action = signal)

if (!is.null(n_extra)) {
Expand Down

0 comments on commit a03ab52

Please sign in to comment.