Skip to content

Commit fb7fdf8

Browse files
authored
Use simple expressions
1 parent f5ddcea commit fb7fdf8

File tree

1 file changed

+2
-2
lines changed

1 file changed

+2
-2
lines changed

R/count-tally.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -213,9 +213,9 @@ tally_n <- function(x, wt) {
213213
}
214214

215215
if (quo_is_null(wt)) {
216-
new_quosure(expr(n()), asNamespace("dplyr"))
216+
expr(dplyr::n())
217217
} else {
218-
new_quosure(expr(sum(!!wt, na.rm = TRUE)), baseenv())
218+
expr(base::sum(!!wt, na.rm = TRUE))
219219
}
220220
}
221221

0 commit comments

Comments
 (0)