@@ -76,13 +76,13 @@ tidyverse_style <- function(scope = "tokens",
7676 indention_manipulators <- if (" indention" %in% scope ) {
7777 list (
7878 indent_braces = partial(indent_braces , indent_by = indent_by ),
79- unindent_fun_dec = unindent_fun_dec ,
79+ unindent_function_declaration = unindent_function_declaration ,
8080 indent_op = partial(indent_op , indent_by = indent_by ),
8181 indent_eq_sub = partial(indent_eq_sub , indent_by = indent_by ),
8282 indent_without_paren = partial(indent_without_paren ,
8383 indent_by = indent_by
8484 ),
85- update_indention_ref_fun_dec = update_indention_ref_fun_dec
85+ update_indention_reference_function_declaration = update_indention_reference_function_declaration
8686 )
8787 }
8888 space_manipulators <- if (" spaces" %in% scope ) {
@@ -102,19 +102,19 @@ tidyverse_style <- function(scope = "tokens",
102102 style_space_around_tilde ,
103103 strict = strict
104104 ),
105- spacing_around_op = purrr :: partial(set_space_around_op ,
105+ spacing_around_op = purrr :: partial(set_space_around_operator ,
106106 strict = strict
107107 ),
108108 remove_space_after_opening_paren = remove_space_after_opening_paren ,
109109 remove_space_after_excl = remove_space_after_excl ,
110110 set_space_after_bang_bang = set_space_after_bang_bang ,
111111 remove_space_around_dollar = remove_space_around_dollar ,
112- remove_space_after_fun_dec = remove_space_after_fun_dec ,
112+ remove_space_after_function_declaration = remove_space_after_function_declaration ,
113113 remove_space_around_colons = remove_space_around_colons ,
114114 start_comments_with_space = partial(start_comments_with_space ,
115115 force_one = start_comments_with_one_space
116116 ),
117- remove_space_after_unary_pm_nested = remove_space_after_unary_pm_nested ,
117+ remove_space_after_unary_plus_minus_nested = remove_space_after_unary_plus_minus_nested ,
118118 spacing_before_comments = if (strict ) {
119119 set_space_before_comments
120120 } else {
@@ -137,8 +137,8 @@ tidyverse_style <- function(scope = "tokens",
137137 set_line_break_before_curly_opening = set_line_break_before_curly_opening ,
138138 remove_line_break_before_round_closing_after_curly =
139139 if (strict ) remove_line_break_before_round_closing_after_curly ,
140- remove_line_breaks_in_fun_dec =
141- if (strict ) remove_line_breaks_in_fun_dec ,
140+ remove_line_breaks_in_function_declaration =
141+ if (strict ) remove_line_breaks_in_function_declaration ,
142142 set_line_breaks_between_top_level_exprs =
143143 if (strict ) set_line_breaks_between_top_level_exprs ,
144144 style_line_break_around_curly = partial(
@@ -180,10 +180,10 @@ tidyverse_style <- function(scope = "tokens",
180180 force_assignment_op = force_assignment_op ,
181181 resolve_semicolon = resolve_semicolon ,
182182 add_brackets_in_pipe = add_brackets_in_pipe ,
183- wrap_if_else_while_for_fun_multi_line_in_curly =
183+ wrap_if_else_while_for_function_multi_line_in_curly =
184184 if (strict ) {
185185 purrr :: partial(
186- wrap_if_else_while_for_fun_multi_line_in_curly ,
186+ wrap_if_else_while_for_function_multi_line_in_curly ,
187187 indent_by = indent_by
188188 )
189189 }
@@ -206,23 +206,23 @@ tidyverse_style <- function(scope = "tokens",
206206 remove_space_after_excl = " '!'" ,
207207 set_space_after_bang_bang = " '!'" ,
208208 remove_space_around_dollar = " '$'" ,
209- remove_space_after_fun_dec = " FUNCTION" ,
209+ remove_space_after_function_declaration = " FUNCTION" ,
210210 remove_space_around_colons = c(" ':'" , " NS_GET_INT" , " NS_GET" ),
211211 start_comments_with_space = " COMMENT" ,
212- remove_space_after_unary_pm_nested = c(" '+'" , " '-'" ),
212+ remove_space_after_unary_plus_minus_nested = c(" '+'" , " '-'" ),
213213 spacing_before_comments = " COMMENT" ,
214214 set_space_in_curly = c(" '{'" , " '}'" )
215215 ),
216216 indention = list (
217217 # indent_braces = c("'('", "'['", "'{'", "')'", "']'", "'}'"),
218- unindent_fun_dec = " FUNCTION" ,
218+ unindent_function_declaration = " FUNCTION" ,
219219 indent_eq_sub = c(" EQ_SUB" , " EQ_FORMALS" ), # TODO rename
220- update_indention_ref_fun_dec = " FUNCTION"
220+ update_indention_reference_function_declaration = " FUNCTION"
221221 ),
222222 line_breaks = list (
223223 set_line_break_before_curly_opening = " '{'" ,
224224 remove_line_break_before_round_closing_after_curly = " '}'" ,
225- remove_line_breaks_in_fun_dec = " FUNCTION" ,
225+ remove_line_breaks_in_function_declaration = " FUNCTION" ,
226226 set_line_break_around_curly_curly = " '{'" ,
227227 style_line_break_around_curly = " '{'" ,
228228 add_line_break_after_pipe = c(" SPECIAL-PIPE" , " PIPE" )
@@ -231,7 +231,7 @@ tidyverse_style <- function(scope = "tokens",
231231 resolve_semicolon = " ';'" ,
232232 add_brackets_in_pipe = c(" SPECIAL-PIPE" , " PIPE" ),
233233 force_assignment_op = " EQ_ASSIGN" ,
234- wrap_if_else_while_for_fun_multi_line_in_curly = c(
234+ wrap_if_else_while_for_function_multi_line_in_curly = c(
235235 " IF" , " WHILE" , " FOR" , " FUNCTION"
236236 )
237237 )
0 commit comments