Nothing
      #' @export
dplyr::`%>%`
# General utilities -------------------------------------------------------
dots_remove_elements <- function(..., .elements = character(0)) {
  dots <- quos(...)
  dots[!(names(dots) %in% .elements)]
}
# Class utilities ---------------------------------------------------------
add_class <- function(x, class) {
  class(x) <- c(class, class(x))
  x
}
add_class_cond <- function(x, class) {
  if (class(x)[1] != class) {
    class(x) <- c(class, class(x))
  }
  x
}
remove_class <- function(x) {
  class(x) <- class(x)[-1]
  x
}
remove_class_cond <- function(x, class) {
  if (class(x)[1] == class) {
    class(x) <- class(x)[-1]
  }
  x
}
# Two tables utilities ----------------------------------------------------
diff_tbl <- function(.tbl1, .tbl2) {
  not_in_tbl2_idx <- which(!(colnames(.tbl1) %in% colnames(.tbl2)))
  select(.tbl1, dplyr::all_of(not_in_tbl2_idx))
}
assign_tbl <- function(.tbl1, .tbl2) {
  .tbl1[, colnames(.tbl2)] <- .tbl2[, ]
  .tbl1
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.