Skip to content

Commit

Permalink
fixed integers
Browse files Browse the repository at this point in the history
  • Loading branch information
Konrad Semsch committed Jan 31, 2021
1 parent c503286 commit 38fcf74
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/naindicate.R
Original file line number Diff line number Diff line change
Expand Up @@ -117,7 +117,7 @@ bake.step_indicate_na <- function(object, new_data, ...) {

df_ind_na <- purrr::map_dfc(
new_data[col_names],
~ifelse(is.na(.x), 1, 0)
~ifelse(is.na(.x), 1L, 0L)
) %>%
dplyr::rename_with(~paste0(object$prefix, "_", .x))
new_data <- dplyr::bind_cols(new_data, df_ind_na)
Expand Down

0 comments on commit 38fcf74

Please sign in to comment.