Skip to content

Commit

Permalink
Fix spelling errors
Browse files Browse the repository at this point in the history
  • Loading branch information
jimhester committed May 4, 2017
1 parent ecadf3e commit 1911a77
Show file tree
Hide file tree
Showing 10 changed files with 10 additions and 10 deletions.
2 changes: 1 addition & 1 deletion R/R.r
Original file line number Diff line number Diff line change
Expand Up @@ -28,7 +28,7 @@ R <- function(args, path = tempdir(), env_vars = character(), fun = system_check
#' Run R CMD xxx from within R
#'
#' @param cmd one of the R tools available from the R CMD interface.
#' @param options a charater vector of options to pass to the command
#' @param options a character vector of options to pass to the command
#' @param path the directory to run the command in.
#' @param env_vars environment variables to set before running the command.
#' @param ... additional arguments passed to \code{\link{system_check}}
Expand Down
2 changes: 1 addition & 1 deletion R/check.r
Original file line number Diff line number Diff line change
Expand Up @@ -102,7 +102,7 @@ check <- function(pkg = ".",
#' @param cran if \code{TRUE} (the default), check using the same settings as
#' CRAN uses.
#' @param check_version Sets \code{_R_CHECK_CRAN_INCOMING_} env var.
#' If \code{TRUE}, performns a number of checked related
#' If \code{TRUE}, performs a number of checked related
#' to version numbers of packages on CRAN.
#' @param force_suggests Sets \code{_R_CHECK_FORCE_SUGGESTS_}. If
#' \code{FALSE} (the default), check will proceed even if all suggested
Expand Down
2 changes: 1 addition & 1 deletion R/dev-help.r
Original file line number Diff line number Diff line change
Expand Up @@ -78,7 +78,7 @@ view_rd <- function(path, package, stage = "render", type = getOption("help_type
#' @inheritParams utils::help utils::`?`
#' @param topic A name or character string specifying the help topic.
#' @param package A name or character string specifying the package in which
#' to search for the help topic. If NULL, seach all packages.
#' to search for the help topic. If NULL, search all packages.
#' @param e1 First argument to pass along to \code{utils::`?`}.
#' @param e2 Second argument to pass along to \code{utils::`?`}.
#' @param ... Additional arguments to pass to \code{\link[utils]{help}}.
Expand Down
2 changes: 1 addition & 1 deletion R/namespace-env.r
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
#' Return the namespace environment for a package.
#'
#' Contains all (exported and non-exported) objects, and is a descendent of
#' \code{R_GlobalEnv}. The hieararchy is \code{<namespace:pkg>},
#' \code{R_GlobalEnv}. The hierarchy is \code{<namespace:pkg>},
#' \code{<imports:pkg>}, \code{<namespace:base>}, and then
#' \code{R_GlobalEnv}.
#'
Expand Down
2 changes: 1 addition & 1 deletion R/revdep.R
Original file line number Diff line number Diff line change
Expand Up @@ -67,7 +67,7 @@ print.maintainers <- function(x, ...) {
#' dependencies. Summarises the results with \code{revdep_check_summary()} and
#' see problems with \code{revdep_check_print_problems()}.
#'
#' Revdep checks are resumably - this is very helpful if somethings goes
#' Revdep checks are resumable - this is very helpful if somethings goes
#' wrong (like you run out of power or you lose your internet connection) in
#' the middle of a check. You can resume a partially completed check with
#' \code{revdep_check_resume()}, or blow away the cached result so you can
Expand Down
2 changes: 1 addition & 1 deletion man/RCMD.Rd

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

2 changes: 1 addition & 1 deletion man/check.Rd

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

2 changes: 1 addition & 1 deletion man/help.Rd

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

2 changes: 1 addition & 1 deletion man/ns_env.Rd

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

2 changes: 1 addition & 1 deletion man/revdep_check.Rd

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

0 comments on commit 1911a77

Please sign in to comment.