View source: R/consecutive_mutate_linter.R
consecutive_mutate_linter | R Documentation |
dplyr::mutate()
accepts any number of columns, so sequences like
DF %>% dplyr::mutate(..1) %>% dplyr::mutate(..2)
are redundant –
they can always be expressed with a single call to dplyr::mutate()
.
consecutive_mutate_linter(invalid_backends = "dbplyr")
invalid_backends |
Character vector of packages providing dplyr backends
which may not be compatible with combining |
An exception is for some SQL back-ends, where the translation logic may not be
as sophisticated as that in the default dplyr
, for example in
DF %>% mutate(a = a + 1) %>% mutate(b = a - 2)
.
configurable, consistency, efficiency, readability
linters for a complete list of linters available in lintr.
# will produce lints
lint(
text = "x %>% mutate(a = 1) %>% mutate(b = 2)",
linters = consecutive_mutate_linter()
)
# okay
lint(
text = "x %>% mutate(a = 1, b = 2)",
linters = consecutive_mutate_linter()
)
code <- "library(dbplyr)\nx %>% mutate(a = 1) %>% mutate(a = a + 1)"
writeLines(code)
lint(
text = code,
linters = consecutive_mutate_linter()
)
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.