Skip to content

Commit e7ed6ae

Browse files
committed
Use @inheritParams
1 parent 7f6570a commit e7ed6ae

File tree

2 files changed

+2
-3
lines changed

2 files changed

+2
-3
lines changed

R/transform-code.R

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -31,9 +31,8 @@ transform_code <- function(path, fun, verbose = FALSE, ...) {
3131
#' an Rmd or Rnw file and recombines the resulting (styled) code chunks with the text
3232
#' chunks.
3333
#'
34-
#' @param lines A character vector of lines from an Rmd or Rnw file.
3534
#' @param transformer_fun A styler transformer function.
36-
#' @param filetype A string indicating the filetype (Rmd or Rnw).
35+
#' @inheritParams separate_chunks
3736
#' @importFrom purrr flatten_chr
3837
#' @keywords internal
3938
transform_mixed <- function(lines, transformer_fun, filetype) {

man/transform_mixed.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)