diff --git a/tests/testthat/test-exclusions.R b/tests/testthat/test-exclusions.R index e81eda6ef..ae405b2d5 100644 --- a/tests/testthat/test-exclusions.R +++ b/tests/testthat/test-exclusions.R @@ -157,7 +157,7 @@ test_that("next-line exclusion works", { withr::local_options( lintr.exclude = "# NL", lintr.exclude_next = "# NLN", - lintr.exlcude_linter = default_settings$exclude_linter + lintr.exclude_linter = default_settings$exclude_linter ) linter <- assignment_linter() diff --git a/tests/testthat/test-object_name_linter.R b/tests/testthat/test-object_name_linter.R index 758c987b1..4a5925198 100644 --- a/tests/testthat/test-object_name_linter.R +++ b/tests/testthat/test-object_name_linter.R @@ -2,7 +2,7 @@ test_that("styles are correctly identified", { do_style_check <- function(nms) lapply(unname(style_regexes), lintr:::check_style, nms = nms) - # symbl UpC lowC snake SNAKE dot allow ALLUP + # symbl UpC lowC snake SNAKE dot alllow ALLUP expect_identical(do_style_check("x"), list(FALSE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE)) expect_identical(do_style_check(".x"), list(FALSE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE)) expect_identical(do_style_check("X"), list(FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE)) diff --git a/tests/testthat/test-paren_brace_linter.R b/tests/testthat/test-paren_brace_linter.R index 45b34e121..44a9f0785 100644 --- a/tests/testthat/test-paren_brace_linter.R +++ b/tests/testthat/test-paren_brace_linter.R @@ -33,7 +33,7 @@ test_that("returns the correct linting", { # paren_brace_linter should ignore strings and comments, as in regexes: expect_lint("grepl('(iss){2}', 'Mississippi')", NULL, linter) expect_lint( - "x <- 123 # dont flag (paren){brace} if inside a comment", + "x <- 123 # don't flag (paren){brace} if inside a comment", NULL, linter )