tests/testthat/line_breaks_and_other/comma-out.R

call(
  a,
  b,
  c
)

call(
  a, b,
  c
)

call(a, )
call(a, )

call(a, )

mpg %>%
  summarise(
    avg_cty = mean(cty),
    avg_hwy = mean(hwy),
    n = n(),
    n_class = n_distinct(class)
  )


1:4 %>%
  {
    (
      . + 1
    )
  }
r-lib/styler documentation built on Sept. 12, 2024, 1:11 p.m.