Skip to content

Commit

Permalink
Update documentation for spell_check
Browse files Browse the repository at this point in the history
  • Loading branch information
jimhester committed Oct 18, 2018
1 parent 9f77a45 commit fcade5b
Show file tree
Hide file tree
Showing 2 changed files with 9 additions and 15 deletions.
13 changes: 5 additions & 8 deletions R/spell-check.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,18 +3,15 @@
#' Runs a spell check on text fields in the package description file, manual
#' pages, and optionally vignettes. Wraps the \link[spelling:spell_check_package]{spelling}
#' package.
#' manual pages. Hunspell includes dictionaries for `en_US` and `en_GB`
#' by default. Other languages require installation of a custom dictionary, see
#' the \href{https://cran.r-project.org/package=hunspell/vignettes/intro.html#system_dictionaries}{hunspell vignette}
#' for details.
#'
#' @export
#' @rdname spell_check
#' @param pkg package description, can be path or package name. See
#' [as.package()] for more information
#' @param vignettes include vignettes in the spell check; passed to
#' \link[spelling:spell_check_package]{spelling::spell_check_package}
spell_check <- function(pkg = ".", vignettes = TRUE) {
#' @param vignettes also check all `rmd` and `rnw` files in the pkg `vignettes` folder
#' @param use_wordlist ignore words in the package [WORDLIST][spelling::get_wordlist] file
#' @inheritParams spelling::spell_check_package
spell_check <- function(pkg = ".", vignettes = TRUE, use_wordlist = TRUE) {
pkg <- as.package(pkg)
spelling::spell_check_package(pkg = pkg, vignettes = vignettes)
spelling::spell_check_package(pkg = pkg, vignettes = vignettes, use_wordlist = TRUE)
}
11 changes: 4 additions & 7 deletions man/spell_check.Rd

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

0 comments on commit fcade5b

Please sign in to comment.