Skip to content

Commit f6ff822

Browse files
committed
don't drop levels in hier_clust prediction
1 parent ca02908 commit f6ff822

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/predict_helpers.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -150,5 +150,5 @@ make_predictions <- function(x, prefix, n_clusters) {
150150
}
151151
pred_clusts <- unique(clusters$.cluster)[pred_clusts_num]
152152

153-
return(factor(pred_clusts))
153+
pred_clusts
154154
}

0 commit comments

Comments
 (0)