Skip to content

Commit

Permalink
fix: Fix tibble tests (#709)
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr authored Dec 14, 2024
1 parent ed671e7 commit 11822e2
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/glimpse.R
Original file line number Diff line number Diff line change
Expand Up @@ -142,7 +142,7 @@ format_glimpse.default <- function(x, ...) {

if (is.null(dims)) {
out <- format(x, trim = TRUE, justify = "none")
style_na_if(out, is.na(x))
style_na_if(out, if (is.atomic(x)) is.na(x) else FALSE)
} else {
dims_out <- paste0(dims, collapse = " x ")
paste0("<", class(x)[[1]], "[", dims_out, "]>")
Expand Down

0 comments on commit 11822e2

Please sign in to comment.