Skip to content

Commit 36f668e

Browse files
Correct spellings (#2549)
1 parent 24d8bc3 commit 36f668e

File tree

4 files changed

+4
-4
lines changed

4 files changed

+4
-4
lines changed

R/condition_call_linter.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -4,7 +4,7 @@
44
#' recommendation of the tidyverse design guide regarding displaying error
55
#' calls.
66
#'
7-
#' @param display_call Logical specifying expected behaviour regarding `call.`
7+
#' @param display_call Logical specifying expected behavior regarding `call.`
88
#' argument in conditions.
99
#' - `NA` forces providing `call. =` but ignores its value (this can be used in
1010
#' cases where you expect a mix of `call. = FALSE` and `call. = TRUE`)

R/unnecessary_nesting_linter.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -91,7 +91,7 @@
9191
#'
9292
#' @evalRd rd_tags("unnecessary_nesting_linter")
9393
#' @seealso
94-
#' - [cyclocomp_linter()] for another linter that penalizes overly complexcode.
94+
#' - [cyclocomp_linter()] for another linter that penalizes overly complex code.
9595
#' - [linters] for a complete list of linters available in lintr.
9696
#' @export
9797
unnecessary_nesting_linter <- function(

man/condition_call_linter.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.

man/unnecessary_nesting_linter.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)