R/foo.R

Defines functions foo bar

Documented in foo

#' Foo Foo
#' @param x x
#' @export
foo <- function(x) {
  1
}

bar <- function(x) {
  stop("hi")
}
r-lib/r-azure-pipelines documentation built on April 6, 2020, 12:01 p.m.