Skip to content

Commit

Permalink
don't document arguments that aren't used
Browse files Browse the repository at this point in the history
  • Loading branch information
EmilHvitfeldt committed Sep 25, 2023
1 parent 7e26290 commit 8a2a5e0
Show file tree
Hide file tree
Showing 4 changed files with 3 additions and 6 deletions.
1 change: 0 additions & 1 deletion R/engine_docs.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,6 @@
#' Knit engine-specific documentation
#' @param pattern A regular expression to specify which files to knit. The
#' default knits all engine documentation files.
#' @param ... Options passed to [knitr::knit()].
#' @return A tibble with column `file` for the file name and `result` (a
#' character vector that echos the output file name or, when there is
#' a failure, the error message).
Expand Down
2 changes: 1 addition & 1 deletion R/hier_clust.R
Original file line number Diff line number Diff line change
Expand Up @@ -171,7 +171,7 @@ translate_tidyclust.hier_clust <- function(x, engine = x$engine, ...) {
#'
#' @param x matrix or data frame
#' @param num_clusters the number of clusters
#' @param h the height to cut the dendrogram
#' @param cut_height the height to cut the dendrogram
#' @param linkage_method the agglomeration method to be used. This should be (an
#' unambiguous abbreviation of) one of `"ward.D"`, `"ward.D2"`, `"single"`,
#' `"complete"`, `"average"` (= UPGMA), `"mcquitty"` (= WPGMA), `"median"` (=
Expand Down
4 changes: 2 additions & 2 deletions man/dot-hier_clust_fit_stats.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 0 additions & 2 deletions man/knit_engine_docs.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 8a2a5e0

Please sign in to comment.