We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent d36ea5b commit 216f418Copy full SHA for 216f418
R/relevel.R
@@ -212,7 +212,7 @@ relocate_eq_assign_one <- function(pd) {
212
idx_eq_assign <- which(pd$token == "EQ_ASSIGN")
213
eq_ind <- seq2(idx_eq_assign[1] - 1L, last(idx_eq_assign) + 1L)
214
# initialize because wrap_expr_in_expr -> create_tokens -> requires it
215
- pd$indent <- NA
+ pd$indent <- 0
216
eq_expr <- pd[eq_ind, ] %>%
217
wrap_expr_in_expr() %>%
218
add_line_col_to_wrapped_expr() %>%
0 commit comments