archive/order_calls.R

# repipe <- function(lst, .call = FALSE) {
#   text <- purrr::map(lst, deparse)
#   text <- purrr::reduce(text, paste, sep = " %>% ")
#   text <- gsub("\\(NULL\\)", "()", text)

#   if (.call) parse(text = text)[[1]]
#   else text
# }
rstudio-education/grader documentation built on July 6, 2023, 8:48 a.m.