Skip to content

Commit

Permalink
fix lint
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy committed Dec 3, 2024
1 parent dd0df12 commit 09428dd
Showing 1 changed file with 4 additions and 1 deletion.
5 changes: 4 additions & 1 deletion R/utils-profiling.R
Original file line number Diff line number Diff line change
Expand Up @@ -51,7 +51,10 @@ get_table_total_missing_values <- function(data) {
collected <-
dplyr::collect(
dplyr::summarise(
data, dplyr::across(dplyr::everything(), function(x) sum(ifelse(is.na(x), 1, 0), na.rm = TRUE))
data, dplyr::across(
dplyr::everything(),
function(x) sum(ifelse(is.na(x), 1, 0), na.rm = TRUE)
)
)
)

Expand Down

0 comments on commit 09428dd

Please sign in to comment.