Skip to content

Commit bc31d3a

Browse files
pre-commit
1 parent 708563d commit bc31d3a

File tree

4 files changed

+14
-39
lines changed

4 files changed

+14
-39
lines changed

R/testing.R

+12-12
Original file line numberDiff line numberDiff line change
@@ -164,16 +164,16 @@ NULL
164164
style_empty <- function(text, base_indention = 0) {
165165
transformers <- list(
166166
# transformer functions
167-
initialize = list(
167+
initialize = list(
168168
default_style_guide_attributes = default_style_guide_attributes
169169
),
170-
line_break = NULL,
171-
space = NULL,
172-
token = NULL,
170+
line_break = NULL,
171+
space = NULL,
172+
token = NULL,
173173
# transformer options
174174
use_raw_indention = FALSE,
175-
reindention = specify_reindention(),
176-
indent_character = " ",
175+
reindention = specify_reindention(),
176+
indent_character = " ",
177177
NULL
178178
)
179179
transformed_text <- parse_transform_serialize_r(text,
@@ -188,18 +188,18 @@ style_empty <- function(text, base_indention = 0) {
188188
style_op <- function(text, base_indention = 0) {
189189
transformers <- list(
190190
# transformer functions
191-
initialize = list(
191+
initialize = list(
192192
default_style_guide_attributes = default_style_guide_attributes
193193
),
194-
line_break = NULL,
195-
space = list(
194+
line_break = NULL,
195+
space = list(
196196
indent_op = partial(indent_op, indent_by = 2)
197197
),
198-
token = NULL,
198+
token = NULL,
199199
# transformer options
200200
use_raw_indention = FALSE,
201-
reindention = specify_reindention(),
202-
indent_character = " ",
201+
reindention = specify_reindention(),
202+
indent_character = " ",
203203
NULL
204204
)
205205

R/visit.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -109,7 +109,7 @@ make_visit_one <- function(funs) {
109109
body <- rlang::call2("{", !!!all_calls)
110110

111111
env <- rlang::as_environment(funs, rlang::base_env())
112-
rlang::new_function(rlang::pairlist2(pd_flat =), body, env)
112+
rlang::new_function(rlang::pairlist2(pd_flat = ), body, env)
113113
}
114114

115115
#' Propagate context to terminals

man/visit.Rd

+1-3
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/visit_one.Rd

-23
This file was deleted.

0 commit comments

Comments
 (0)