Releases: r-lib/lintr
lintr 3.1.2
New and improved features
Lint accuracy fixes: removing false positives
unreachable_code_linter()
ignores reachable code in inline functions likefunction(x) if (x > 2) stop() else x
(#2259, @MEO265).unnecessary_lambda_linter()
- ignores extractions with explicit returns like
lapply(l, function(x) foo(x)$bar)
(#2258, @MichaelChirico). - ignores calls on the RHS of operators like
lapply(l, function(x) "a" %in% names(x))
(#2310, @MichaelChirico).
- ignores extractions with explicit returns like
vector_logic_linter()
recognizes some cases where bitwise&
/|
are used correctly (#1453, @MichaelChirico).expect_comparison_linter()
ignores faulty usage likeexpect_true(x, y > z)
(#2083, @MichaelChirico). Note thaty > z
is being passed to theinfo=
argument, so this is likely a mistake.consecutive_assertion_linter()
ignores cases where a second assertion follows an intervening assignment with=
(#2444, @MichaelChirico).
Lint accuracy fixes: removing false negatives
missing_argument_linter()
catches all missing arguments in calls with several, e.g.foo(,,)
gives 3 lints instead of 2 (#2399, @MichaelChirico).duplicate_argument_linter()
no longer misses cases with duplicate arguments where a comment comes between the argument name and=
(#2402, @MichaelChirico).
Notes
- Fixed a test assuming a specific parser error message that recently changed in r-devel (#2527, @IndrajeetPatil).
- @MichaelChirico has taken over CRAN maintainer duties for the package. Many thanks to @jimhester for more than 10 years and 15 releases wearing that hat!!
lintr 3.1.1
Breaking changes
infix_spaces_linter()
distinguishes<-
,:=
,<<-
and->
,->>
, i.e.infix_spaces_linter(exclude_operators = "->")
will no longer exclude->>
(#2115, @MichaelChirico). This change is breaking for users relying on manually-suppliedexclude_operators
containing"<-"
to also exclude:=
and<<-
. The fix is to manually supply":="
and"<<-"
as well. We don't expect this change to affect many users, the fix is simple, and the new behavior is much more transparent, so we are including this breakage in a minor release.- Removed
find_line()
andfind_column()
entries fromget_source_expressions()
expression-level objects. These have been marked deprecated since version 3.0.0. No users were found on GitHub. - There is experimental support for writing config in plain R scripts (as opposed to DCF files; #1210, @MichaelChirico). The script is run in a new environment and variables matching settings (
?default_settings
) are copied over. In particular, this removes the need to write R code in a DCF-friendly way, and allows normal R syntax highlighting in the saved file. We may eventually deprecate the DCF approach in favor of this one; user feedback is welcome on strong preferences for either approach, or for a different approach like YAML. Generally you should be able to convert your existing.lintr
file to an equivalent R config by replacing the:
key-value separators with assignments (<-
). By default, such a config is searched for in a file named '.lintr.R'. This is a mildly breaking change if you happened to be keeping a file '.lintr.R' around since that file is given precedence over '.lintr'.- We also validate config files up-front make it clearer when invalid configs are present (#2195, @MichaelChirico). There is a warning for "invalid" settings, i.e., settings not part of
?default_settings
. We think this is more likely to affect users declaring settings in R, since any variable defined in the config that's not a setting must be removed to make it clearer which variables are settings vs. ancillary.
- We also validate config files up-front make it clearer when invalid configs are present (#2195, @MichaelChirico). There is a warning for "invalid" settings, i.e., settings not part of
Bug fixes
sprintf_linter()
doesn't error in cases where whitespace in...
arguments is significant, e.g.sprintf("%s", if (A) "" else y)
, which won't parse if whitespace is removed (#2131, @MichaelChirico).
Changes to default linters
assignment_linter()
lints the {magrittr} assignment pipe%<>%
(#2008, @MichaelChirico). This can be deactivated by setting the new argumentallow_pipe_assign
toTRUE
.object_usage_linter()
:- assumes
glue()
isglue::glue()
wheninterpret_glue=TRUE
(#2032, @MichaelChirico). - finds function usages, including infix usage, inside
glue()
calls to avoid false positives for "unused objects" (#2029 and #2069, @MichaelChirico).
- assumes
object_name_linter()
no longer attempts to lint strings in function calls on the LHS of assignments (#1466, @MichaelChirico).infix_spaces_linter()
allows finer control for linting=
in different scenarios using parse tagsEQ_ASSIGN
,EQ_SUB
, andEQ_FORMALS
(#1977, @MichaelChirico).equals_na_linter()
checks forx %in% NA
, which is a more convoluted form ofis.na(x)
(#2088, @MichaelChirico).
New and improved features
- New exclusion sentinel
# nolint next
to signify the next line should skip linting (#1791, @MichaelChirico). The usual rules apply for excluding specific linters, e.g.# nolint next: assignment_linter.
. The exact string used to match a subsequent-line exclusion is controlled by theexclude_next
config entry or R option"lintr.exclude_next"
. - New
xp_call_name()
helper to facilitate writing custom linters (#2023, @MichaelChirico). This helper converts a matched XPath to the R function to which it corresponds. This is useful for including the "offending" function in the lint's message. - New
make_linter_from_xpath()
to facilitate making simple linters directly from a single XPath (#2064, @MichaelChirico). This is especially helpful for making on-the-fly/exploratory linters, but also extends to any case where the linter can be fully defined from a static lint message and single XPath. - Toggle lint progress indicators with argument
show_progress
tolint_dir()
andlint_package()
(#972, @MichaelChirico). The default is still to show progress ininteractive()
sessions. Progress is also now shown with a "proper" progress bar (utils::txtProgressBar()
), which in particular solves the issue of progress.
spilling well past the width of the screen in large directories. lint()
,lint_dir()
, andlint_package()
fail more gracefully when the user mis-spells an argument name (#2134, @MichaelChirico).- Quarto files (.qmd) are included by
lint_dir()
by default (#2150, @dave-lovell).
New linters
library_call_linter()
can detect if all library/require calls are not at the top of your script (#2027, #2043, #2163, and #2170, @nicholas-masel and @MichaelChirico).keyword_quote_linter()
for finding unnecessary or discouraged quoting of symbols in assignment, function arguments, or extraction (part of #884, @MichaelChirico). Quoting is unnecessary when the target is a valid R name, e.g.c("a" = 1)
can bec(a = 1)
. The same goes to assignment ("a" <- 1
) and extraction (x$"a"
). Where quoting is necessary, the linter encourages doing so with backticks (e.g.x$`a b`
instead ofx$"a b"
).length_levels_linter()
for using the specific functionnlevels()
instead of checkinglength(levels(x))
(part of #884, @MichaelChirico).scalar_in_linter()
for discouraging%in%
when the right-hand side is a scalar, e.g.x %in% 1
(part of #884, @MichaelChirico).if_not_else_linter()
for encouragingif
statements to be structured asif (A) x else y
instead ofif (!A) y else x
(part of #884, @MichaelChirico).repeat_linter()
for encouragingrepeat
for infinite loops instead ofwhile (TRUE)
(#2106, @MEO265).length_test_linter()
detects the common mistakelength(x == 0)
which is meant to belength(x) == 0
(#1991, @MichaelChirico).
Extensions to existing linters
fixed_regex_linter()
gains an optionallow_unescaped
(defaultFALSE
) to toggle linting regexes not requiring any escapes or character classes (#1689, @MichaelChirico). Thusfixed_regex_linter(allow_unescaped = TRUE)
would lint ongrepl("[$]", x)
but not ongrepl("a", x)
since the latter does not use any regex special characters.line_length_linter()
helpfully includes the line length in the lint message (#2057, @MichaelChirico).conjunct_test_linter()
also lints usage likedplyr::filter(x, A & B)
in favor of usingdplyr::filter(x, A, B)
(part of #884; #2110 and #2078, @salim-b and @MichaelChirico). Optionallow_filter
toggles when this applies.allow_filter = "always"
drops such lints entirely, while"not_dplyr"
only lints calls explicitly qualified asdplyr::filter()
. The default,"never"
, assumes all unqualified calls tofilter()
aredplyr::filter()
.sort_linter()
checks for code likex == sort(x)
which is better served by using the functionis.unsorted()
(part of #884, @MichaelChirico).paste_linter()
gains detection for file paths that are better constructed withfile.path()
, e.g.paste0(dir, "/", file)
would be better asfile.path(dir, file)
(part of #884, #2082, @MichaelChirico). What exactly gets linted here can be fine-tuned with theallow_file_path
option ("double_slash"
by default, with alternatives"never"
and"always"
). When"always"
, these rules are ignored. When"double_slash"
, paths appearing to construct a URL that have consecutive forward slashes (/
) are skipped. When"never"
, even URLs should be constructed withfile.path()
.seq_linter()
recommendsrev()
in the lint message for lints likenrow(x):1
(#1542, @MichaelChirico).function_argument_linter()
detects usage ofmissing()
for the linted argument (#1546, @MichaelChirico). The simplest fix forfunction_argument_linter()
lints is typically to set that argument toNULL
by default, in which case it's usually preferable to update function logic checkingmissing()
to checkis.null()
instead.commas_linter()
gains an optionallow_trailing
(defaultFALSE
) to allow trailing commas while indexing. (#2104, @MEO265)unreachable_code_linter()
implicit_assignment_linter()
gains an argumentallow_lazy
(defaultFALSE
) that allows optionally skipping lazy assignments likeA && (B <- foo(A))
(#2016, @MichaelChirico).unused_import_linter()
gains an argumentinterpret_glue
(defaultTRUE
) paralleling that inobject_usage_linter()
to toggle whetherglue::glue()
expressions should be inspected for exported object usage (#2042, @MichaelChirico).default_undesirable_functions
is updated to also includeSys.unsetenv()
andstructure()
(#2192 and #2228, @IndrajeetPatil and @MichaelChirico).- Linters with logic around the magrittr pipe
%>%
consistently apply it to the other pipes%!>%
,%T>%
,%<>%
(and possibly%$%
) where appropriate (#2008, @MichaelChirico).brace_linter()
pipe_call_linter()
pipe_continuation_linter()
unnecessary_concatenation_linter()
unnecessary_placeholder_linter()
- Linters with logic around function declarations consistently include the R 4.0.0 shorthand
\()
(#2190, @MichaelChirico).brace_linter()
function_left_parentheses_linter()
indentation_linter()
object_length_linter()
object_name_linter()
package_hooks_linter()
paren_body_linter()
- `unnecessary_lambda_linte...
lintr 3.1.0
Deprecations & Breaking Changes
.lintr
files can now be kept in the directory.github/linters
for better compatibility with Super-Linter. Note that this may be a breaking change if you already have a config in.github/linters
inside a subdirectory as well as in your R project's root, since the former will now be discovered first where it was ignored before. Please seevignette("lintr")
for details on how configs are discovered (#1746, @tonyk7440 and @klmr).single_quotes_linter()
is deprecated in favor of the more generalizablequotes_linter()
(#1729, @MichaelChirico).unneeded_concatentation_linter()
is deprecated in favor ofunnecessary_concatenation_linter()
for naming consistency (#1707, @IndrajeetPatil).consecutive_stopifnot_linter()
is deprecated in favor of the more general (see below)consecutive_assertion_linter()
(#1604, @MichaelChirico).no_tab_linter()
is deprecated in favor ofwhitespace_linter()
for naming consistency and future generalization (#1954, @MichaelChirico).available_linters()
prioritizestags
overexclude_tags
in the case of overlap, i.e., tags listed in both arguments are included, not excluded. We don't expect many people to be affected by this, and the old behavior was not made explicit in the documentation, but make note of it here since it required changing a test in lintr's own suite wherelinters_with_tags()
implicitly assumed this behavior.lint()
,lint_dir()
, andlint_package()
no longer accept certain arguments (cache=
forlint()
,relative_path=
for the latter two) positionally. Thewarning()
since 3.0.0 has been upgraded to an error.
Bug fixes
-
linters_with_tags()
now includes the previously missing spaces around "and" when listing missing linters advertised byavailable_linters()
.
This error message may appear e.g. when you update lintr to a version with new linters but don't restart your R session (#1946, @Bisaloo) -
fixed_regex_linter()
is more robust to errors stemming from unrecognized escapes (#1545, #1845, @IndrajeetPatil). -
get_source_expressions()
can handle Sweave/Rmarkdown documents with reference chunks like<<ref_file>>
(#779, @MichaelChirico).
Note that these are simply skipped, rather than attempting to retrieve the reference and also lint it. -
assignment_linter()
no longer lints assignments in braces that include comments whenallow_trailing = FALSE
(#1701, @ashbaldry) -
object_usage_linter()
- No longer silently ignores usage warnings that don't contain a quoted name (#1714, @AshesITR)
- No longer fails on code with comments inside a multi-line call to
glue::glue()
(#1919, @MichaelChirico)
-
namespace_linter()
correctly recognizes backticked operators to be exported from respective namespaces (likerlang::`%||%`
) (#1752, @IndrajeetPatil) -
lint_package()
correctly finds a package from within a subdir if thepath
points to anywhere within the package (#1759, @AshesITR) -
Improved error behavior in
Lint()
,lint()
andxml_nodes_to_lints()
(#1427, #763, @AshesITR)Lint()
validates its inputs more thoroughly, preventing errors duringprint.Lints
like "Error in rep.int(character, length) : invalid 'times' value:".lint()
no longer tries to create an expression tree with unexpected end of input errors, because they can be broken.xml_nodes_to_lints()
warns if it can't find lint locations and uses dummy locations as a fallback.
-
linters_with_defaults()
no longer erroneously marks linter factories as linters (#1725, @AshesITR). -
Row names for
available_linters()
data frame are now contiguous (#1781, @IndrajeetPatil). -
object_name_linter()
allows all S3 group Generics (see?base::groupGeneric
) and S3 generics defined in a different file in the same package (#1808, #1841, @AshesITR) -
object_usage_linter()
improves identification of the exact source of a lint- for undefined variables in expressions with where the variable is used as a symbol in a usual way, for example in a formula or in an extraction with
$
(#1914, @MichaelChirico). - for general usage warnings without location info (#1986 and #1917, @AshesITR)
- for undefined variables in expressions with where the variable is used as a symbol in a usual way, for example in a formula or in an extraction with
-
function_left_parentheses_linter()
produces a more specific lint (and no longer fails) when the opening parenthesis is on a different line thanfunction
or the call name (#1953, @MichaelChirico). Thanks also to @IndrajeetPatil and @lorenzwalthert for identifying a regression in the initial fix, #1963.
Changes to defaults
-
Set the default for the
except
argument induplicate_argument_linter()
toc("mutate", "transmute")
.
This allows sequential updates likex |> mutate(a = b + 1, a = log(a))
(#1345, @IndrajeetPatil). -
object_usage_linter()
- gains
skip_with
argument to skip code inwith()
expressions. To be consistent with
R CMD check
, it defaults toTRUE
(#941, #1458, @IndrajeetPatil). - Handles backticked symbols inside {glue} expressions correctly, e.g.
glue("{`x`}")
correctly
determinesx
was used (#1619, @MichaelChirico) - Detects problems inside R4.1.0+ lambda functions (
\(...)
) (#1933, @MichaelChirico)
- gains
-
spaces_inside_linter()
allows terminal missing keyword arguments (e.g.alist(arg = )
; #540, @MichaelChirico) -
brace_linter()
allows empty braced expression on the same line (e.g.while (updating_condition()) { }
)
regardless ofallow_single_line
to match the corresponding behavior in {styler}. This is an expedient while
the style guide on handling this case awaits clarification: tidyverse/style#191.
(#1346, @MichaelChirico) -
undesirable_function_linter()
andundesirable_operator_linter()
now produce an error
if empty vector of undesirable functions or operators is provided (#1867, @IndrajeetPatil). -
New linters which are also included as defaults (see "New linters" for more details):
indentation_linter()
quotes_linter()
unnecessary_concatenation_linter()
whitespace_linter()
-
lint_package()
also looks for files inexec/
(#1950, @jmaspons).
New and improved features
-
New
get_r_string()
helper to get the R-equivalent value of a string, especially useful for R-4-style raw strings.
Previously an internallintr
helper, now exported to facilitate writing custom linters (#1493, @MichaelChirico). -
object_usage_linter()
improves lint metadata when detecting undefined infix operators, e.g.%>%
or:=
(#1497, @MichaelChirico) -
unused_import_linter()
can detect datasets from imported packages and no longer
warns when a package is imported only for its datasets (#1545, @IndrajeetPatil). -
When a linter triggers an error,
lint()
will provide a more actionable summary of where the
error occurred, particularly useful for cases likelint_package()
where both the responsible file
and the responsible linter would be unknown (@MichaelChirico).Typically, linters should not themselves cause R to stop -- syntax errors lead to error lints,
for example. Please report such failures as they are likely bugs. -
pipe_continuation_linter()
recognizes violations involving the native R pipe|>
(#1609, @MichaelChirico) -
paste_linter()
also catches usages likepaste(rep("*", 10L), collapse = "")
that can be written more
concisely asstrrep("*", 10L)
(#1108, @MichaelChirico) -
spaces_inside_linter()
produces lints for spaces inside[[
(#1673, @IndrajeetPatil). -
sprintf_linter()
also applies togettextf()
(#1677, @MichaelChirico) -
Documentation for all linters contains examples of code that does and does not produce lints (#1492, @IndrajeetPatil).
-
implicit_integer_linter()
gains parameterallow_colon
to skip lints on expressions like1:10
(#1155, @MichaelChirico) -
infix_spaces_linter()
supports the native R pipe|>
(#1793, @AshesITR) -
unnecessary_concatenation_linter()
(f.k.a.unneeded_concatenation_linter()
) no longer lints onc(...)
(i.e., passing...
in a function call) whenallow_single_expression = FALSE
(#1696, @MichaelChirico) -
object_name_linter()
gains parameterregexes
to allow custom naming conventions (#822, #1421, @AshesITR) -
literal_coercion_linter()
reports a replacement in the lint message, e.g. code likeas.integer(1)
will
suggest using1L
instead, and code likeas.numeric(NA)
will suggest usingNA_real_
instead (#1439, @MichaelChirico) -
Added
format()
functions forlint
andlints
(#1784, @AshesITR) -
all_linters()
function provides an easy way to access all available linters (#1843, @IndrajeetPatil) -
missing_argument_linter()
allows missing arguments inquote()
calls (#1889, @IndrajeetPatil). -
get_source_expressions()
correctly extracts indented code chunks from R Markdown documents, which helps avoid spurious lints related to whitespace (#1945, @MichaelChirico). The convention taken is that, within each chunk, all code is anchored relative to the leftmost non-whitespace column. -
available_linters()
gives priority totags
overexclude_tags
in the case of overlap. In particular, this means thatavailable_linters(tags = "deprecated")
will work to return deprecated linters without needing to specifyexclude_tags
(#1959, @MichaelChirico). -
The {lintr} configuration file is now searched in the system's user configuration path; the lintr config filename can
also be configured explicitly by setting the environment variableR_LINTR_LINTER_FILE
(#460, @klmr) -
Errors in the {lintr} configuration file now produce more informative error messages (#886, @AshesITR)
New linters
matrix_apply_linter()
recommends use of dedicatedrowSums()
,colSums()
,colMeans()
,rowMeans()
overapply(., MARGIN, sum)
orapply(., MARGIN, mean)
. The recommended alternative is much mor...
lintr 3.0.2
- Fix test to avoid leaving behind cache files in the global cache directory.
lintr 3.0.1
-
Skip multi-byte tests in non UTF-8 locales (#1504)
-
modify_defaults()
no longer uses the mistaken"lintr_function"
S3 class, instead applying the
"linter"
class also common toLinter()
.Linter()
also includes"function"
in the S3
class of its output to facilitate S3 dispatch tofunction
methods where appropriate (#1392, @MichaelChirico).
Changes to defaults
-
brace_linter()
allows opening curly braces on a new line when there is
a comment ending the preceding line (#1433 and #1434, @IndrajeetPatil). -
seq_linter()
produces lint forseq(...)
, since it also cannot properly
handle empty edge cases (#1468, @IndrajeetPatil). -
seq_linter()
additionally lints on1:n()
(from {dplyr})
and1:.N
(from {data.table}) (#1396, @IndrajeetPatil). -
literal_coercion_linter()
lints {rlang}'s atomic vector constructors
(i.e.,int()
,chr()
,lgl()
, anddbl()
) if the argument is a scalar
(#1437, @IndrajeetPatil). -
redundant_ifelse_linter()
's lint message correctly suggests negation when
theyes
condition is0
(#1432, @IndrajeetPatil). -
seq_linter()
provides more specific replacement code in lint message
(#1475, @IndrajeetPatil).
New and improved features
-
unreachable_code_linter()
ignores trailing comments if they match a closing nolint block (#1347, @AshesITR). -
New
function_argument_linter()
to enforce that arguments with defaults appear last in function declarations,
see the Tidyverse design guide (#450, @AshesITR). -
New
allow_trailing
argument added toassignment_linter()
to check when assignment operators are at the
end of a line, and the value is on the following line (#1491, @ashbaldry)
New features
commented_code_linter()
now lints commented argument code, containing a trailing comma, as well (#386, @AshesITR).
For example a comment containing# na.rm = TRUE,
now triggers a lint.
Bug fixes
object_length_linter()
does not fail in case there are dependencies with no exports (e.g. data-only packages) (#1509, @IndrajeetPatil).get_source_expressions()
no longer fails on R files that match a knitr pattern (#743, #879, #1406, @AshesITR).- Parse error lints now appear with the linter name
"error"
instead ofNA
(#1405, @AshesITR).
Also, linting no longer runs if thesource_expressions
contain invalid string data that would cause error messages
in other linters. - Prevent
lint()
from hanging on Rmd files with some syntax errors (#1443, @MichaelChirico). get_source_expressions()
no longer omits trailing non-code lines from knitr files (#1400, #1415, @AshesITR).
This fixes the location information fortrailing_blank_lines_linter()
in RMarkdown documents without terminal
newlines.- The
vignette("lintr")
incorrectly citedexclude
as the key for setting file exclusions in.lintr
when it is
actuallyexclusions
. (#1401, @AshesITR) - Fixed file exclusion detection in
lint_dir()
so it no longer errors if there are multiple exclusions or no global
exclusions configured for a single file (#1413, #1442, @AshesITR).
Other changes
- The minimum needed version for soft dependency
{withr}
has been bumped to2.5.0
(#1404, @IndrajeetPatil). - Changed the deprecation warning for
with_defaults()
to also mentionmodify_defaults()
(#1438, @AshesITR).
lintr 3.0.0
Breaking changes
-
All linters are now function factories (i.e., functions that return functions) for consistency. Previously, only
linters with customizable parameters were factories (#245, @fangly, @AshesITR, and @MichaelChirico).This means that usage such as
lint("file.R", seq_linter)
should be updated tolint("file.R", seq_linter())
, and
the following update for custom linters:my_custom_linter <- function(source_expression) { ... } # becomes my_custom_linter <- function() Linter(function(source_expression) { ... })
-
Exclusions specified in the
.lintr
file are now relative to the location of that file
and support excluding entire directories (#158, #438, @AshesITR). -
Removed long-deprecated linters (they've been marked as deprecated since v1.0.1 in 2017):
absolute_paths_linter()
camel_case_linter()
multiple_dots_linter()
snake_case_linter()
trailing_semicolons_linter()
-
Removed
return()
fromall_undesirable_functions
because early returns (which often improve
readability and reduce code complexity) require explicit use ofreturn()
. Follow #1100 for
an upcomingreturn_linter()
to lint unnecessaryreturn()
statements (#1146, @AshesITR).
Note that you can replicate old behavior by supplyingreturn
as a custom undesirable function:
undesirable_function_linter(c(all_undesirable_functions, list(return = NA)))
Deprecations
- Lints are now marked with the name of the
linter
that caused them instead of the name of their implementation
function. Deprecated the obsoletelinter
argument ofLint()
(#664, #673, #746, @AshesITR). Downstream custom
linters should follow suit. - Renamed
semicolon_terminator_linter()
tosemicolon_linter()
for better consistency.
semicolon_terminator_linter()
survives but is marked for deprecation. The new linter also has a new signature,
taking argumentsallow_compound
andallow_trailing
to replace the old single argumentsemicolon
, again for
signature consistency with other linters. - The following linters were subsumed into
brace_linter()
and are now deprecated; see the item onbrace_linter()
below:closed_curly_linter()
open_curly_linter()
paren_brace_linter()
- The
...
argument forlint()
,lint_dir()
, andlint_package()
has been promoted to an earlier position to
better match the Tidyverse design principle of
data->descriptor->details. This change enables passing objects to...
without needing to specify non-required
arguments, e.g.lint_dir("/path/to/dir", linter())
now works without the need to specifyrelative_path
.
This affects some code that uses positional arguments (#935, @MichaelChirico).- For
lint()
,...
is now the 3rd argument, where earlier this wascache
. - For
lint_dir()
andlint_package()
,...
is now the 2nd argument, where earlier this wasrelative_path
.
- For
- Deprecated argument
source_file
to exported functionswith_id()
andids_with_token()
. It has been renamed to
source_expression
to better reflect that this argument is typically the output ofget_source_expressions()
.
For now, the old argumentsource_file
can still be used (with warning). The now-private functional versions of many
linters also underwent the same renaming (source_file
->source_expression
). This has no direct effect on
packages importing lintr, but is mentioned in case custom linters imitatinglintr
style had also adopted the
source_file
naming and want to adapt to keep in sync. - Deprecated
with_defaults()
in favor oflinters_with_defaults()
, and addmodify_defaults()
which is intended to
be used more generally to modify (i.e., extend, trim, and/or update) a list of defaults. Note that the argument
corresponding towith_defaults()
'sdefault=
is calleddefaults=
(i.e., pluralized) in both of these, and that
usage likewith_defaults(default = NULL, ...)
should be converted tolinters_with_defaults(defaults = list(), ...)
(#1029, #1336, #1361, @AshesITR and @MichaelChirico). - Deprecated the
find_line()
andfind_column()
helpers from the item-levelexpressions
returned with
get_source_expressions()
. These helpers were typically associated with regex-based logic for building linters,
which is rarely needed and prone to false positives; now that lintr almost exclusively uses XPath-based
logic for linters, these are no longer necessary (#1373, @MichaelChirico).
Other changes to defaults
Updates to default_linters
- New
brace_linter()
which combines several curly brace related linters, deprecating the following predecessors
(#1041, @AshesITR):closed_curly_linter()
; both now also allow}]
in addition to})
and},
as exceptions, i.e.,}
doesn't
need to be on its own line if paired with a closing square bracket, a closing parenthesis, or a comma. Also
improved lint metadata so that source markers land at the closing brace instead of the closing parenthesis to
improve the experience of fixing the lint (#583, @AshesITR).open_curly_linter()
; both also no longer lint unnecessary trailing whitespace (usetrailing_whitespace_linter()
for this) and also allow(
,,
, and%>%
on preceding lines as exceptions, i.e.,{
can be alone on a line if
the previous line is terminated with an opening parenthesis, a comma, or a pipe (%>%
) (#487, #1028, @AshesITR).paren_brace_linter()
;brace_linter()
also lintsif
/else
andrepeat
with missing whitespace.brace_linter()
also newly enforces the following rules surrounding curly braces (originally Google linters, see
below):- Require
else
to come on the same line as the preceding}
, if present (#884, @MichaelChirico). - Require functions spanning multiple lines to use curly braces (#987, @MichaelChirico).
- Require balanced usage of
{}
inif
/else
conditions, i.e., if theif
branch uses braces,
then so must theelse
branch, and vice versa (#983, @MichaelChirico).
- Require
- New
paren_body_linter()
checks that there is a space between a right parenthesis and a body expression (#809,
@kpagacz). - Added
semicolon_linter()
as a default because it enforces a tidyverse style guide rule (#683, @AshesITR). assignment_linter()
(#915, @MichaelChirico):- Right assignments are now linted by default (
->
and->>
). - New argument
allow_cascading_assign
(TRUE
by default) toggles whether to lint<<-
and->>
. - New argument
allow_right_assign
(FALSE
by default) toggles whether to lint->
and->>
.
- Right assignments are now linted by default (
commented_code_linter()
: use the parse tree to find comments, eliminating some false positives (#451, @AshesITR).equals_na_linter()
(#545, @MichaelChirico):- Extended to lint
x != NA
(before, only==
was caught) andNA == x
(before, onlyNA
on RHS was caught). - Extended to skip usages in comments like
is.na(x) # use is.na(x), not x == NA
.
- Extended to lint
function_left_parentheses_linter()
: improved location information (#1266, #1267, @AshesITR).infix_spaces_linter()
:- Added argument
allow_multiple_spaces
(TRUE
by default) which toggles
whether to generate a lint for operators used with multiple spaces, e.g.x + 2
.
The default setting allows extra spacing to be used to increase
line-to-line alignment (#940, @f-ritter and @MichaelChirico). - Extended so that usages like
a~b
andfunction(a=1) { ... }
are linted (#930, #michaelchirico). - Added argument
exclude_operators
to disable lints on selected infix operators.
By default, all "low-precedence" operators throw lints; see?infix_spaces_linter
for an enumeration of these.
(#914, @MichaelChirico). - Add an exception for
/
usage inbox::use()
declarations (#1087, @klmr).
- Added argument
line_length_linter()
: place the source marker at the margin of the affected line to improve user experience
during de-linting -- just press Return (#735, @AshesITR).*no_tab_linter()
: use more reliable matching (e.g., excluding matches found in comments; #441, @russHyde).object_length_linter()
: correctly detect generics and only count the implementation class towards the length.
This prevents false positive lints in the case of long generic names, e.g.
very_very_very_long_generic_name.short_class
no longer produces a lint (#871, @AshesITR).object_name_linter()
:- Improved generic detection -- in user-defined method
my_method.upstream.class
,
upstream.class
no longer throws a lint because the generic (my_method
)
properly usessnake_case
(#737, @AshesITR). - Exclude special R namespace hook functions such as
.onLoad()
(#500, #614, @AshesITR and @MichaelChirico). - Correctly detect imported functions when linting packages (#642, @AshesITR).
- Correctly detect assignment generics like
names<-.class_name
(#843, @jonkeane). - Added new styles
"symbols"
and"SNAKE_CASE"
(#494, #495, #615, #670, @MichaelChirico and @AshesITR)."symbols"
is a new default style which won't lint all-symbol object names. In particular, that means
operator names like%+%
are allowed.
- No longer lints names used in
$
extractions (#582, @AshesITR).
- Improved generic detection -- in user-defined method
object_usage_linter()
:- Detect global variables if there are top-level dollar-assignments (#666, @AshesITR).
- Report usage warnings spanning multiple lines (#507, @AshesITR).
- Detect usages inside
glue::glue()
constructs (#942, @AshesITR). - Extended to include functions assigned with
=
instead of<-
(#1081, @MichaelChirico). - Detect functions exported by packages that are explicitly attached using
library()
or
require()
calls (#1127, @AshesITR)....
lintr 2.0.1
v2.0.1 Update test version
lintr 2.0.0
lintr 2.0.0
lintr 2.0.0 is a major release, and incorporates development changes since the last major release (1.0.0) in 2016-04-16.
Deprecated functions
- Deprecated
camel_case_linter()
,snake_case_linter()
andmultiple_dots_linter()
in favor ofobject_name_linter()
which enforce the given style: snake_case,
dotted.case, lowerCamelCalse, UpperCamelCase, alllowercase or ALLUPPERCASE
(#59, @fangly). - Deprecated absolute_paths_linter() in favor of the new
absolute_path_linter()
,
with a lax mode for fewer false positive lints (#199, fangly).
New linters
- New
cyclocomp_linter()
identifies overly complex functions (#361, @fabian-s) - New
equals_na_linter()
(#143, #326, @jabranham) - New
extraction_operator_linter()
checks that the[[
operator is used when
extracting a single element from an object, not[
(subsetting) nor$
(interactive use) (@fangly). - New
function_left_parentheses_linter()
to check that there is no space between
a function name and its left parentheses (#204, @jrnold). - New
implicit_integer_linter()
detects round numbers not declared as integers,
i.e. 1 instead of 1L (@fangly). - New
nonportable_path_linter()
identifies paths constructed without file.path()
(@fangly). - New
paren_brace_linter()
checks that there is a space between right
parenthesis and an opening curly brace (@bfgray3, #242). - New
pipe_continuation_linter()
to ensure there is a space before %>% and newline afterwards (#216). - New
semicolon_terminator_linter()
reports semicolons at the end a line (#147,
@gaborcsardi) and between expressions (#181, @fangly). - New
seq_linter()
, finds1:length(...)
(and similar) expressions (#155, @gaborcsardi) - New
todo_comment_linter()
lints TODOs (@fangly). - New
T_and_F_symbol_linter()
warns when using T and F instead of TRUE and FALSE
(@fangly). - New
undesirable_operator_linter()
andundesirable_function_linter()
lint uses of
user-specified functions and operators (#48, #149, @fangly). - New
unneeded_concatenation_linter()
lints uses of c() with a constant or no
arguments (@fangly).
New functions for writing linters
- Export
expect_lint()
(#178, #210) - Export
ids_with_token()
andwith_id()
(#297 @stufield) - linters can use the XML parse tree as well now, via the
https://github.com/MangoTheCat/xmlparsedata package (#154, @gaborcsardi)
New functions for users
- New
lint_dir()
function to lint files under a given directory (@arekbee, #360) - New
summary.lints()
function to summarize the linter results (#260, #262, @wlandau). - New
checkstyle_output()
function to output lints to checkstyle XML output (#156, @joshkgold)
Linter fixes
closed_curly_linter()
now allows closing parenthesis or comma after closing curly brace (#167, @Enchufa2)commas_linter()
now handles missing arguments calls properly (#145)commented_code_linter()
now relaxed, it no longer lints comments within roxygen blocks
and does not consider "-" an R operator to avoid too many false positives.function_left_parentheses_linter()
now allows spaces if a function starts with a left parenthesis (#311)no_tab_linter()
now reports proper line in all cases (#134, @fangly)object_length_linter()
argumentlength
now defaults to 30 for consistency (#325 @dragosmg)object_name_linter()
now works when passed multiple styles (#341, @infotroph)object_usage_linter()
has been changed to better detect lexical scoping of global variables (#27, #336, #91, #382)object_usage_linter()
now respectsutils::globalVariables()
, so it can be used to avoid false positive warnings due to non-standard evaluation (#352)object_usage_linter()
now ignores top level calls that contain function definitions (#26).object_linter*()
s now only lint objects declared in the current file
(#76, #108, #136, #191, #194, #201, @fangly).open_curly_linter()
andclosed_curly_linter()
now do not lint double curly syntax (#388)open_curly_linter()
now allows comments after the curly braces (#188)pipe_continuation_linter()
now behaves better in nested expressions, functions etc. (#366 @russHyde)space_inside_linter()
now reports proper line and column numbers (#203, @fangly)
General improvements and fixes
expect_lint()
now no longer shows Rstudio markers and error messages are correctly preserved (#180, #211, @fangly)Lint()
/as.data.frame()
error now fixed (#179, @fangly).lint()
no longer errors with inline\\Sexpr
(#127).lint()
no longer errors with '<% %>' constructs (#185).lint_package()
now works with the cache, as intended (#146, @schloerke)lint_package()
now excludesR/RcppExports.R
by default (#282)lint_package()
now removes fully excluded files as soon as possible to- lintr now looks up its configuration in any parent directories as well as the package directory (#238, #345)
seq_linter
is now one of the default linters (#316).- Fix issue in lintr's compatibility with R-devel, due to to a new version of the PCRE library (#411.)
read_settings()
now has a better error message when the config file does
not end with a newline (#160, #189)expect_lint_free()
is now automatically skipped when run on covr (#287)- Now lintr only tries to generate comments if running in wercker or travis CI (#166)
- Add support for overriding GitHub API Token via
GITHUB_TOKEN
environment
variable (#63, @mattyb) - Config files are now also searched for in the users' home directory (#266, @randy3k)
- Fixed crash caused by ambiguous cache file paths (#212, @fangly).
- RStudio addins to lint current source and project (fixes #264, @JhossePaul)
- Added proper handling of tab characters (fixes #44, @fangly)
- lintr does not need the igraph package any more (#152, @gaborcsardi)
- Fixed cache not saved in a directory other than requested (#213, @fangly)
avoid reading and pre-processing of ignored files (@mwaldstein) - Allow for any number of
#
to start a comment. Useful in ESS (#299, @prosoitos) - R Markdown files that do not contain chunks are no longer treated as code (#370).
- Fixed plain-code-block bug in Rmarkdown (#252, @russHyde)
- Fixed bug where non-R chunks using {lang}
engine format
were parsed from R-markdown (#322, @russHyde) - Ensured
lintr
runs / installs / tests on R-3.6: pinned to github
xmlparsedata
; ensure vectors are length-1 when compared using&&
and||
(#363 #377 #384 #391, @russHyde).
lintr v1.0.3
- Fix tests to work with changes in the parser in R 3.6
lintr v1.0.2
- Fix tests to work with upcoming testthat release.