Skip to content

Commit 29599f1

Browse files
Merge pull request #1049 from Polkas/1048_setlinebreak
Rename internal function `set_linebreak_after_ggplot2_plus()` to `set_line_break_after_ggplot2_plus()`
2 parents a995a35 + 43fa650 commit 29599f1

File tree

3 files changed

+4
-4
lines changed

3 files changed

+4
-4
lines changed

R/rules-line-breaks.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -390,7 +390,7 @@ remove_line_break_in_fun_call <- function(pd, strict) {
390390
}
391391

392392

393-
set_linebreak_after_ggplot2_plus <- function(pd) {
393+
set_line_break_after_ggplot2_plus <- function(pd) {
394394
# if expression is unary, first token is +. Exclude this case.
395395
is_plus_raw <- c(FALSE, pd$token[-1L] == "'+'")
396396
if (any(is_plus_raw)) {

R/style-guides.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -165,8 +165,8 @@ tidyverse_style <- function(scope = "tokens",
165165
strict = strict
166166
),
167167
add_line_break_after_pipe = if (strict) add_line_break_after_pipe,
168-
set_linebreak_after_ggplot2_plus = if (strict) {
169-
set_linebreak_after_ggplot2_plus
168+
set_line_break_after_ggplot2_plus = if (strict) {
169+
set_line_break_after_ggplot2_plus
170170
}
171171
)
172172
}

tests/testthat/test-transformers-drop.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -76,7 +76,7 @@ test_that("tidyverse transformers are correctly dropped", {
7676
"set_line_break_after_opening_if_call_is_multi_line",
7777
"set_line_break_before_closing_call",
7878
"remove_line_break_in_fun_call",
79-
"set_linebreak_after_ggplot2_plus"
79+
"set_line_break_after_ggplot2_plus"
8080
)
8181
expect_setequal(names(t_fun$line_break), names_line_break)
8282

0 commit comments

Comments
 (0)