Skip to content

Commit 419044e

Browse files
expose recursive again because it's not always TRUE
1 parent 1761581 commit 419044e

File tree

4 files changed

+7
-8
lines changed

4 files changed

+7
-8
lines changed

R/ui-styling.R

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -272,8 +272,7 @@ prettify_any <- function(transformers,
272272
setdiff(c("", exclude_dirs)) %>%
273273
dir_without_.(
274274
pattern = map_filetype_to_pattern(filetype),
275-
ignore.case = TRUE, recursive = FALSE,
276-
all.files = TRUE
275+
recursive = FALSE
277276
)
278277
} else {
279278
files_other <- c()

R/utils-files.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -42,20 +42,20 @@ map_filetype_to_pattern <- function(filetype) {
4242
#' @keywords internal
4343
#' @examples
4444
#' setdiff("./file.R", "file.R") # you want to standardize first.
45-
dir_without_. <- function(path, ...) {
46-
purrr::map(path, dir_without_._one, ...) %>%
45+
dir_without_. <- function(path, recursive = TRUE, ...) {
46+
purrr::map(path, dir_without_._one, recursive = recursive, ...) %>%
4747
unlist()
4848
}
4949

5050
#' `dir()`, but with full names, ignored case, and included hidden files and
5151
#' recursive.
5252
#' @keywords internal
53-
dir_without_._one <- function(path, ...) {
53+
dir_without_._one <- function(path, recursive, ...) {
5454
relative <- dir(
5555
path = path,
5656
full.names = FALSE,
5757
ignore.case = TRUE,
58-
recursive = TRUE,
58+
recursive = recursive,
5959
all.files = TRUE,
6060
...
6161
)

man/dir_without_..Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/dir_without_._one.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)