Skip to content

Commit d4c75d1

Browse files
clean new lint
1 parent 1c7fc4d commit d4c75d1

File tree

1 file changed

+1
-2
lines changed

1 file changed

+1
-2
lines changed

R/ui-styling.R

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -108,9 +108,8 @@ prettify_pkg <- function(transformers,
108108
filetype_ <- set_and_assert_arg_filetype(filetype)
109109
r_files <- rprofile_files <- vignette_files <- readme <- NULL
110110
all_files <- list.files(".", recursive = TRUE, all.files = TRUE)
111-
exclude_files <- grep(paste0(exclude_files, collapse = "|"), all_files, value = TRUE)
111+
exclude_files <- grep(paste(exclude_files, collapse = "|"), all_files, value = TRUE)
112112
exclude_files <- set_arg_paths(exclude_files)
113-
exclude_files_regex <- paste0(exclude_files[!file.exists(exclude_files)], collapse = "|")
114113
exclude_files <- c(
115114
exclude_files,
116115
dir_without_.(exclude_dirs, pattern = map_filetype_to_pattern(filetype))

0 commit comments

Comments
 (0)