diff --git a/tests/testthat/indention_multiple/overall-in.R b/tests/testthat/indention_multiple/overall-in.R index 6f9113e38..45fb3fe1a 100644 --- a/tests/testthat/indention_multiple/overall-in.R +++ b/tests/testthat/indention_multiple/overall-in.R @@ -9,7 +9,7 @@ a <- function(x) { )) if (x > 10) { for (x in 22) { # FIXME in operator only to be surrounded by one space. What about %in%? - prin(x) + print(x) } } }) diff --git a/tests/testthat/indention_multiple/overall-out.R b/tests/testthat/indention_multiple/overall-out.R index 4db2b90fc..f7dc4e2a2 100644 --- a/tests/testthat/indention_multiple/overall-out.R +++ b/tests/testthat/indention_multiple/overall-out.R @@ -9,7 +9,7 @@ a <- function(x) { )) if (x > 10) { for (x in 22) { # FIXME in operator only to be surrounded by one space. What about %in%? - prin(x) + print(x) } } }) diff --git a/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-in.R b/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-in.R index 641e72d52..3695fd91d 100644 --- a/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-in.R +++ b/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-in.R @@ -70,7 +70,6 @@ fun( s = g(x), gg = a(n == 2) |> b(), tt |> q(r = 3)) -# FIXME closing brace could go on ntext line. Alternative: remove lin breaks completely. blew(x |> c(), y = 2) diff --git a/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-out.R b/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-out.R index ae22d7c9e..969ba47ba 100644 --- a/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-out.R +++ b/tests/testthat/line_breaks_and_other/base-pipe-line-breaks-out.R @@ -75,7 +75,6 @@ fun( tt |> q(r = 3) ) -# FIXME closing brace could go on ntext line. Alternative: remove lin breaks completely. blew( x |> c(), diff --git a/tests/testthat/line_breaks_and_other/pipe-line-breaks-in.R b/tests/testthat/line_breaks_and_other/pipe-line-breaks-in.R index a60021669..2092a3a39 100644 --- a/tests/testthat/line_breaks_and_other/pipe-line-breaks-in.R +++ b/tests/testthat/line_breaks_and_other/pipe-line-breaks-in.R @@ -72,7 +72,6 @@ fun( s = g(x), gg = a(n == 2) %>% b, tt %>% q(r = 3)) -# FIXME closing brace could go on ntext line. Alternative: remove lin breaks completely. blew(x %>% c(), y = 2) diff --git a/tests/testthat/line_breaks_and_other/pipe-line-breaks-out.R b/tests/testthat/line_breaks_and_other/pipe-line-breaks-out.R index 61593b217..b4e021c7b 100644 --- a/tests/testthat/line_breaks_and_other/pipe-line-breaks-out.R +++ b/tests/testthat/line_breaks_and_other/pipe-line-breaks-out.R @@ -80,7 +80,6 @@ fun( tt %>% q(r = 3) ) -# FIXME closing brace could go on ntext line. Alternative: remove lin breaks completely. blew( x %>% c(), diff --git a/tests/testthat/line_breaks_fun_call/named_arguments-in.R b/tests/testthat/line_breaks_fun_call/named_arguments-in.R index f9c70a872..c0de22255 100644 --- a/tests/testthat/line_breaks_fun_call/named_arguments-in.R +++ b/tests/testthat/line_breaks_fun_call/named_arguments-in.R @@ -16,3 +16,21 @@ map2(dat1, data2, fun, x, y, map2(dat1, data2, fun, x = 1, y = 2, z ) + +c( + x, y, + c( + 'b' + ), m, n, fun(f = 2 + # comment-2 + ) +) +# comment-1 +c( + c( + 'b' + ), fun( + f = 2 + ), e, f, + g +) diff --git a/tests/testthat/line_breaks_fun_call/named_arguments-out.R b/tests/testthat/line_breaks_fun_call/named_arguments-out.R index 485e4d609..e61ff5aa8 100644 --- a/tests/testthat/line_breaks_fun_call/named_arguments-out.R +++ b/tests/testthat/line_breaks_fun_call/named_arguments-out.R @@ -22,3 +22,25 @@ map2(dat1, data2, fun, x = 1, y = 2, z ) + +c( + x, y, + c( + "b" + ), + m, n, fun( + f = 2 + # comment-2 + ) +) +# comment-1 +c( + c( + "b" + ), + fun( + f = 2 + ), + e, f, + g +) diff --git a/tests/testthat/scope-AsIs/scope_none-in.R b/tests/testthat/scope-AsIs/scope_none-in.R index 2c770501f..9948a34df 100644 --- a/tests/testthat/scope-AsIs/scope_none-in.R +++ b/tests/testthat/scope-AsIs/scope_none-in.R @@ -9,7 +9,7 @@ a<- function(x){ )) if (x > 10) { for (x in 22) { # FIXME in operator only to be surrounded by one space. What about %in%? - prin(x) + print(x) } } } ) diff --git a/tests/testthat/scope-AsIs/scope_none-out.R b/tests/testthat/scope-AsIs/scope_none-out.R index 2c770501f..9948a34df 100644 --- a/tests/testthat/scope-AsIs/scope_none-out.R +++ b/tests/testthat/scope-AsIs/scope_none-out.R @@ -9,7 +9,7 @@ a<- function(x){ )) if (x > 10) { for (x in 22) { # FIXME in operator only to be surrounded by one space. What about %in%? - prin(x) + print(x) } } } ) diff --git a/tests/testthat/scope-character/scope_none-in.R b/tests/testthat/scope-character/scope_none-in.R index 2c770501f..9948a34df 100644 --- a/tests/testthat/scope-character/scope_none-in.R +++ b/tests/testthat/scope-character/scope_none-in.R @@ -9,7 +9,7 @@ a<- function(x){ )) if (x > 10) { for (x in 22) { # FIXME in operator only to be surrounded by one space. What about %in%? - prin(x) + print(x) } } } ) diff --git a/tests/testthat/scope-character/scope_none-out.R b/tests/testthat/scope-character/scope_none-out.R index 2c770501f..9948a34df 100644 --- a/tests/testthat/scope-character/scope_none-out.R +++ b/tests/testthat/scope-character/scope_none-out.R @@ -9,7 +9,7 @@ a<- function(x){ )) if (x > 10) { for (x in 22) { # FIXME in operator only to be surrounded by one space. What about %in%? - prin(x) + print(x) } } } )