Skip to content

Commit

Permalink
don't re-export dplyr_reconstruct()
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Sep 28, 2023
1 parent a807167 commit 589edd4
Show file tree
Hide file tree
Showing 4 changed files with 5 additions and 7 deletions.
1 change: 0 additions & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -167,7 +167,6 @@ export(control_grid)
export(control_last_fit)
export(control_resamples)
export(coord_obs_pred)
export(dplyr_reconstruct)
export(empty_ellipses)
export(encode_set)
export(estimate_tune_results)
Expand Down
3 changes: 3 additions & 0 deletions R/compat-dplyr.R
Original file line number Diff line number Diff line change
@@ -1,3 +1,6 @@
#' @importFrom dplyr dplyr_reconstruct
dplyr::dplyr_reconstruct

#' @noRd
#' @export
dplyr_reconstruct.tune_results <- function(data, template) {
Expand Down
4 changes: 0 additions & 4 deletions R/reexports.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,10 +3,6 @@
#' @export
dials::parameters

#' @importFrom dplyr dplyr_reconstruct
#' @export
dplyr::dplyr_reconstruct

#' @importFrom ggplot2 autoplot
#' @export
ggplot2::autoplot
Expand Down
4 changes: 2 additions & 2 deletions man/reexports.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 589edd4

Please sign in to comment.