Skip to content

Commit 992849b

Browse files
lorenzwalthertjonmcalder
authored andcommitted
set default to vector so it is obvious that it can take length > 1.
1 parent 8593547 commit 992849b

File tree

3 files changed

+3
-3
lines changed

3 files changed

+3
-3
lines changed

API

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -8,7 +8,7 @@ specify_math_token_spacing(zero = NULL, one = c("'+'", "'-'", "'*'", "'/'", "'^'
88
specify_reindention(regex_pattern = regex_none(), indention = 0, comments_only = TRUE)
99
style_dir(path = ".", ..., style = tidyverse_style, transformers = style(...), filetype = "R", recursive = TRUE, exclude_files = NULL)
1010
style_file(path, ..., style = tidyverse_style, transformers = style(...))
11-
style_pkg(pkg = ".", ..., style = tidyverse_style, transformers = style(...), filetype = "R", exclude_files = "R/RcppExports.R")
11+
style_pkg(pkg = ".", ..., style = tidyverse_style, transformers = style(...), filetype = c("r"), exclude_files = "R/RcppExports.R")
1212
style_text(text, ..., style = tidyverse_style, transformers = style(...))
1313
tidyverse_math_token_spacing()
1414
tidyverse_reindention()

R/ui.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -40,7 +40,7 @@ style_pkg <- function(pkg = ".",
4040
...,
4141
style = tidyverse_style,
4242
transformers = style(...),
43-
filetype = "R",
43+
filetype = c("r"),
4444
exclude_files = "R/RcppExports.R") {
4545
pkg_root <- rprojroot::find_package_root_file(path = pkg)
4646
changed <- withr::with_dir(pkg_root, prettify_local(transformers, exclude_files))

man/style_pkg.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)