Skip to content

Commit e051e81

Browse files
fix lints
1 parent 1a3ef50 commit e051e81

File tree

4 files changed

+4
-5
lines changed

4 files changed

+4
-5
lines changed

.lintr

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -8,7 +8,6 @@ linters: linters_with_tags(
88
line_length_linter(120L),
99
namespace_linter = NULL,
1010
nested_ifelse_linter = NULL,
11-
# TODO: remove this once the lint message is fixed
1211
nzchar_linter = NULL,
1312
object_name_linter = NULL,
1413
object_length_linter(70L),

R/addins.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -72,7 +72,7 @@ style_active_file <- function() {
7272
}
7373
rstudioapi::modifyRange(
7474
c(1L, 1L, length(context$contents) + 1L, 1L),
75-
paste0(ensure_last_n_empty(out), collapse = "\n"),
75+
paste(ensure_last_n_empty(out), collapse = "\n"),
7676
id = context$id
7777
)
7878
if (save_after_styling_is_active() && context$path != "") {
@@ -132,7 +132,7 @@ style_selection <- function() {
132132
)
133133
rstudioapi::modifyRange(
134134
context$selection[[1L]]$range,
135-
paste0(c(
135+
paste(c(
136136
out,
137137
if (context$selection[[1L]]$range$end[2L] == 1L) ""
138138
), collapse = "\n"),

R/detect-alignment-utils.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -161,7 +161,7 @@ alignment_serialize <- function(pd_sub) {
161161
if (anyNA(out)) {
162162
return(NA)
163163
}
164-
paste0(out, collapse = "")
164+
paste(out, collapse = "")
165165
}
166166

167167
#' Check if spacing around comma is correct

R/roxygen-examples-parse.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -68,7 +68,7 @@ parse_roxygen <- function(roxygen) {
6868
roxygen_remove_extra_brace <- function(parsed) {
6969
parsed <- rlang::try_fetch(
7070
{
71-
parse(text = paste0(gsub("^\\\\[[:alpha:]]*", "", parsed), collapse = ""))
71+
parse(text = paste(gsub("^\\\\[[:alpha:]]*", "", parsed), collapse = ""))
7272
parsed
7373
},
7474
error = function(e) {

0 commit comments

Comments
 (0)