Skip to content

Commit

Permalink
Merge pull request #73 from tidymodels/lint-seq-colon
Browse files Browse the repository at this point in the history
use `seq_len()` instead of `:`
  • Loading branch information
hfrick authored Apr 3, 2023
2 parents 2ab7c03 + a8e8426 commit 3e38cae
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/poisson_reg-glmnet.R
Original file line number Diff line number Diff line change
Expand Up @@ -105,7 +105,7 @@ multi_predict._fishnet <-
)
param_key <- tibble(group = colnames(pred), penalty = penalty)
pred <- as_tibble(pred)
pred$.row <- 1:nrow(pred)
pred$.row <- seq_len(nrow(pred))
pred <- gather(pred, group, .pred, -.row)
if (utils::packageVersion("dplyr") >= "1.0.99.9000") {
pred <- full_join(param_key, pred, by = "group", multiple = "all")
Expand Down

0 comments on commit 3e38cae

Please sign in to comment.