Skip to content

Commit

Permalink
Merge branch 'standard_grouped_summary' of https://github.com/LukasTa…
Browse files Browse the repository at this point in the history
…ng/dplyr into standard_grouped_summary
  • Loading branch information
LukasTang committed Sep 15, 2024
2 parents 0c87305 + 2c7a69a commit f62c037
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/standard_summary.R
Original file line number Diff line number Diff line change
Expand Up @@ -23,6 +23,7 @@
#'
#' @export
standard_summary <- function(df, vars, functions = list(
sum = ~sum(.x, na.rm = TRUE)
mean = ~mean(.x, na.rm = TRUE),
sd = ~sd(.x, na.rm = TRUE),
min = ~min(.x, na.rm = TRUE),
Expand All @@ -46,5 +47,4 @@ standard_summary <- function(df, vars, functions = list(
pivot_wider(id_cols = c(gg, "VARIABLE"), values_from = value, names_from = STAT) %>%
as.data.frame()
return(summary_res)

}

0 comments on commit f62c037

Please sign in to comment.