Skip to content

Commit

Permalink
Avoid materialization
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed Nov 22, 2024
1 parent d45af59 commit b4dbd7e
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/tbl-format-footer.R
Original file line number Diff line number Diff line change
Expand Up @@ -61,7 +61,7 @@ format_footer <- function(x, setup) {
}

format_footer_extra_rows <- function(x, setup) {
if (ncol(setup$x) != 0) {
if (length(setup$df) != 0) {
if (is.na(setup$rows_missing)) {
c("more", "rows")
} else if (setup$rows_missing > 0) {
Expand Down

0 comments on commit b4dbd7e

Please sign in to comment.