Skip to content

Commit a9a6e34

Browse files
AshesITRMichaelChiricojimhester
authored
Version from 2.0.1.9001 to 3.0.0 (#836)
* change deprecated versions from 2.0.1.9001 to 3.0.0 fixes #835 * typo in NEWS (#1367) * Rename old master branch to main in .dev/compare_branches (#1372) * Deprecate find col (#1374) * first pass -- scorched earth * deprecate instead * whitespace * NEWS Co-authored-by: AshesITR <[email protected]> * Another round of NEWS polishing (#1370) * add reasoning to "return" removal * mention old argument still works * combine+clarify some brace_linter items, add attributions * consistent capitalization, clarifications * finish pass for consistent capitalizatoin * grammar * move object_name bullet with others; clarify cyclocomp bullet * mention CRAN policy re: cache directory * more consistently reference only the issue (not PR) #s * consistent capitalization in my GH username * missing item for any_duplicated_linter * improve description of system_file_linter * clarify strings_as_factors_linter, more grammar * more quantification of package speed-ups; more clarirfication * more removing redundant issue references; reorg bullet for get_source_expressions * clarification, remove redundant issue refs * move another object_name_linter bullet up * move extraction_operator item to "features" not bugs * trailing whitespace * trailing whitespace * feedback * lead with Deprecated * wording for object_usage * de-lint (#1378) * de-lint * tidyverse style, missing space Co-authored-by: Michael Chirico <[email protected]> * add tag "executing" to linters that call eval() or loadNamespace() on arbitrary input (#1383) * benchmarking in .dev/compare_branches (#1375) * skeleton for new --benchmark parameter * incredibly hacky (but working on main at least) tracing approach * Rename old master branch to main in .dev/compare_branches * tweaks * run .Last() even interactively * debugging complete! works on main * handle --branch=$TAG * help mentions tag; git_branch_checkout doesnt work * need to git reset * robustly get linter call * cant rely on ~recent internal helper for encoding * remove remotes from temp repo * handle odd case of line_length_linter, muffle newline warnings * warn with tag names, not hashes * implement _all_ option for linters, skip more noisy warnings * fix default handling; simplify encoding test; correct branch-specific timings * combine timings, save output * save in wide format instead * comment * correct message * add a TODO * sum timing across expressions in output * correct data.table imports * refactor: use more helpers * consolidate more * another helper * more refactoring... pray this works * tweaks go get working * correct handling of timing output * add a TODO * clarify TODO * correct data.table imports again * more nesting! * one more helper * remove debugger * simplify warning message match Co-authored-by: AshesITR <[email protected]> * Polish news (#1384) * consistent formatting * sort bullets alphabetically * add `allow_trailing = FALSE` to `missing_argument_linter()` (#1385) * update deprecations * usethis::use_version("major") * update reference checkstyle.xml Co-authored-by: Michael Chirico <[email protected]> Co-authored-by: Michael Chirico <[email protected]> Co-authored-by: Jim Hester <[email protected]>
1 parent df28b66 commit a9a6e34

File tree

11 files changed

+13
-13
lines changed

11 files changed

+13
-13
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
Package: lintr
22
Title: A 'Linter' for R Code
3-
Version: 2.0.1.9000
3+
Version: 3.0.0
44
Authors@R: c(
55
person("Jim", "Hester", email = "[email protected]", role = c("aut", "cre")),
66
person("Florent", "Angly", role = "aut"),

NEWS.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
# lintr (development version)
1+
# lintr 3.0.0
22

33
## Breaking changes
44

R/closed_curly_linter.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -9,7 +9,7 @@
99
#' <https://style.tidyverse.org/syntax.html#indenting>
1010
#' @export
1111
closed_curly_linter <- function(allow_single_line = FALSE) {
12-
lintr_deprecated("closed_curly_linter", new = "brace_linter", version = "2.0.1.9001", type = "Linter")
12+
lintr_deprecated("closed_curly_linter", new = "brace_linter", version = "3.0.0", type = "Linter")
1313
xp_cond_closed <- xp_and(c(
1414
# matching { is on same line
1515
if (isTRUE(allow_single_line)) {

R/ids_with_token.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -22,7 +22,7 @@
2222
#' @export
2323
ids_with_token <- function(source_expression, value, fun = `==`, source_file) {
2424
if (!missing(source_file)) {
25-
lintr_deprecated(old = "source_file", new = "source_expression", version = "2.0.1.9001", type = "Argument")
25+
lintr_deprecated(old = "source_file", new = "source_expression", version = "3.0.0", type = "Argument")
2626
source_expression <- source_file
2727
}
2828
if (!is_lint_level(source_expression, "expression")) {

R/lint.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -329,13 +329,13 @@ validate_linter_object <- function(linter, name) {
329329
if (is_linter_factory(linter)) {
330330
old <- "Passing linters as variables"
331331
new <- "a call to the linters (see ?linters)"
332-
lintr_deprecated(old = old, new = new, version = "2.0.1.9001",
332+
lintr_deprecated(old = old, new = new, version = "3.0.0",
333333
type = "")
334334
linter <- linter()
335335
} else {
336336
old <- "The use of linters of class 'function'"
337337
new <- "linters classed as 'linter' (see ?Linter)"
338-
lintr_deprecated(old = old, new = new, version = "2.0.1.9001",
338+
lintr_deprecated(old = old, new = new, version = "3.0.0",
339339
type = "")
340340
linter <- Linter(linter, name = name)
341341
}
@@ -449,7 +449,7 @@ Lint <- function(filename, line_number = 1L, column_number = 1L, # nolint: objec
449449
if (!missing(linter)) {
450450
lintr_deprecated(
451451
old = "Using the `linter` argument of `Lint()`",
452-
version = "2.0.1.9001",
452+
version = "3.0.0",
453453
type = ""
454454
)
455455
}

R/open_curly_linter.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -9,7 +9,7 @@
99
#' <https://style.tidyverse.org/syntax.html#indenting>
1010
#' @export
1111
open_curly_linter <- function(allow_single_line = FALSE) {
12-
lintr_deprecated("open_curly_linter", new = "brace_linter", version = "2.0.1.9001", type = "Linter")
12+
lintr_deprecated("open_curly_linter", new = "brace_linter", version = "3.0.0", type = "Linter")
1313

1414
xpath_before <- "//OP-LEFT-BRACE[
1515
not(following-sibling::expr[1][OP-LEFT-BRACE])

R/paren_brace_linter.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,7 @@
66
#' @seealso [linters] for a complete list of linters available in lintr.
77
#' @export
88
paren_brace_linter <- function() {
9-
lintr_deprecated("paren_brace_linter", new = "brace_linter", version = "2.0.1.9001", type = "Linter")
9+
lintr_deprecated("paren_brace_linter", new = "brace_linter", version = "3.0.0", type = "Linter")
1010

1111
xpath <- paste(
1212
"//OP-LEFT-BRACE[",

R/semicolon_linter.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -65,7 +65,7 @@ semicolon_terminator_linter <- function(semicolon = c("compound", "trailing")) {
6565
lintr_deprecated(
6666
old = "semicolon_terminator_linter",
6767
new = "semicolon_linter",
68-
version = "2.0.1.9001",
68+
version = "3.0.0",
6969
type = "Linter"
7070
)
7171
semicolon <- match.arg(semicolon, several.ok = TRUE)

R/with.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -169,7 +169,7 @@ linters_with_defaults <- function(..., defaults = default_linters) {
169169
#' @rdname linters_with_defaults
170170
#' @export
171171
with_defaults <- function(..., default = default_linters) {
172-
lintr_deprecated("with_defaults", "linters_with_defaults", "2.0.9001")
172+
lintr_deprecated("with_defaults", "linters_with_defaults", "3.0.0")
173173
# to ease the burden of transition -- default = NULL used to behave like defaults = list() now does
174174
if (is.null(default)) default <- list()
175175
linters_with_defaults(..., defaults = default)

R/with_id.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,7 @@
1111
#' @export
1212
with_id <- function(source_expression, id, source_file) {
1313
if (!missing(source_file)) {
14-
lintr_deprecated(old = "source_file", new = "source_expression", version = "2.0.1.9001", type = "Argument")
14+
lintr_deprecated(old = "source_file", new = "source_expression", version = "3.0.0", type = "Argument")
1515
source_expression <- source_file
1616
}
1717
if (!is_lint_level(source_expression, "expression")) {

0 commit comments

Comments
 (0)