dev_history.Rmd empty

library(testthat)

Common title for 2 functions

#' My median
#'
#' @param x Vector of Numeric values
#' @inheritParams stats::median
#'
#' @return
#' Median of vector x
#' @export
#'
#' @examples
#' my_median(2:20)
my_median <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  stats::median(x, na.rm = na.rm)
}
my_median(1:12)
test_that("my_median works properly and show error if needed", {
  expect_error(my_median("text"))
})
#' My median2
#'
#' @param x Vector of Numeric values
#' @inheritParams stats::median
#'
#' @return
#' Median of vector x
#' @export
#'
#' @examples
#' my_median2(2:20)
my_median2 <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  stats::median(x, na.rm = na.rm)
}
my_median2(1:12)
test_that("my_median2 works properly and show error if needed", {
  expect_error(my_median2("text"))
})

Two functions, same chunk param

fun_chunk1

#' My fun_chunk1
#'
#' @param x Vector of Numeric values
#' @inheritParams stats::median
#'
#' @return
#' Median of vector x
#' @export
#'
#' @examples
#' my_fun_chunk1(2:20)
my_fun_chunk1 <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  stats::median(x, na.rm = na.rm)
}
my_fun_chunk1(1:12)
test_that("my_fun_chunk1 works properly and show error if needed", {
  expect_error(my_fun_chunk1("text"))
})

fun_chunk2

#' My fun_chunk2
#'
#' @param x Vector of Numeric values
#' @inheritParams stats::median
#'
#' @return
#' Median of vector x
#' @export
#'
#' @examples
#' my_fun_chunk2(2:20)
my_fun_chunk2 <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  stats::median(x, na.rm = na.rm)
}
my_fun_chunk2(1:12)
test_that("my_fun_chunk2 works properly and show error if needed", {
  expect_error(my_fun_chunk2("text"))
})

Two functions, same @rdname

fun_rdname1

#' My fun_rdname1
#'
#' @param x Vector of Numeric values
#' @inheritParams stats::median
#'
#' @rdname same_rdname
#' @return
#' Median of vector x
#' @export
#'
#' @examples
#' my_fun_rdname1(2:20)
my_fun_rdname1 <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  stats::median(x, na.rm = na.rm)
}
my_fun_rdname1(1:12)
test_that("my_fun_rdname1 works properly and show error if needed", {
  expect_error(my_fun_rdname1("text"))
})

fun_rdname2

#' @rdname same_rdname
#' @importFrom stats median
#' @export
my_fun_rdname2 <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  median(x, na.rm = na.rm)
}
my_fun_rdname2(1:12)
test_that("my_fun_rdname2 works properly and show error if needed", {
  expect_error(my_fun_rdname2("text"))
})

Two functions, mix same @filename + chunk param

fun_filename1

#' My fun_filename1
#'
#' @param x Vector of Numeric values
#' @inheritParams stats::median
#'
#' @filename same_filename
#' @return
#' Median of vector x
#' @export
#'
#' @examples
#' my_fun_filename1(2:20)
my_fun_filename1 <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  stats::median(x, na.rm = na.rm)
}
my_fun_filename1(1:12)
test_that("my_fun_filename1 works properly and show error if needed", {
  expect_error(my_fun_filename1("text"))
})

fun_filename2

#' My fun_filename2
#'
#' @param x Vector of Numeric values
#' @inheritParams stats::median
#'
#' @return
#' Median of vector x
#' @export
#'
#' @examples
#' my_fun_filename2(2:20)
my_fun_filename2 <- function(x, na.rm = TRUE) {
  if (!is.numeric(x)) {stop("x should be numeric")}
  stats::median(x, na.rm = na.rm)
}
my_fun_filename2(1:12)
test_that("my_fun_filename2 works properly and show error if needed", {
  expect_error(my_fun_filename2("text"))
})
# Run but keep eval=FALSE to avoid infinite loop
# Execute in the console directly
fusen::inflate(flat_file = "dev/dev_history.Rmd")


Try the fusen package in your browser

Any scripts or data that you put into this service are public.

fusen documentation built on Aug. 17, 2023, 5:09 p.m.