Skip to content

Commit

Permalink
pass correct col_names
Browse files Browse the repository at this point in the history
  • Loading branch information
EmilHvitfeldt committed Jul 18, 2023
1 parent 112daa2 commit 9d4bb97
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/geodist.R
Original file line number Diff line number Diff line change
Expand Up @@ -248,7 +248,7 @@ bake.step_geodist <- function(object, new_data, ...) {
geo_data <- check_name(geo_data, new_data, object, newname = object$name)

new_data <- vec_cbind(new_data, geo_data)
new_data <- remove_original_cols(new_data, object, names(object$columns))
new_data <- remove_original_cols(new_data, object, col_names)
new_data
}

Expand Down
2 changes: 1 addition & 1 deletion R/indicate_na.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, ...) {
cols <- check_name(cols, new_data, object, names(cols))

new_data <- vec_cbind(new_data, cols)
new_data <- remove_original_cols(new_data, object, names(object$columns))
new_data <- remove_original_cols(new_data, object, col_names)
new_data
}

Expand Down

0 comments on commit 9d4bb97

Please sign in to comment.