We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 584a294 commit 27c0c53Copy full SHA for 27c0c53
R/ws.R
@@ -145,17 +145,6 @@ style_file <- function(path,
145
transformers = style(...)) {
146
withr::with_dir(
147
dirname(path),
148
- prettify_one(transformers, basename(path))
+ transform_files(basename(path), transformers)
149
)
150
}
151
-
152
-#' Prettify one R file
153
-#'
154
-#' This is a helper function for style_dir.
155
-#' @inheritParams style_dir
156
-#' @param path The path to a file that should be styled.
157
-prettify_one <- function(transformers, path) {
158
- if (!grepl("\\.[r](md)?$", path, ignore.case = TRUE))
159
- stop(path, " is not an R or Rmd file")
160
- transform_files(path, transformers)
161
-}
man/prettify_one.Rd
0 commit comments