Skip to content

Commit 1ce825f

Browse files
committed
pass checks and redocument
1 parent cd2c583 commit 1ce825f

9 files changed

+19
-5
lines changed

NAMESPACE

+4
Original file line numberDiff line numberDiff line change
@@ -192,8 +192,10 @@ export(mutate)
192192
export(nested_quantiles)
193193
export(new_default_epi_recipe_blueprint)
194194
export(new_epi_recipe_blueprint)
195+
export(pivot_longer)
195196
export(pivot_quantiles_longer)
196197
export(pivot_quantiles_wider)
198+
export(pivot_wider)
197199
export(prep)
198200
export(quantile_reg)
199201
export(rand_id)
@@ -328,6 +330,8 @@ importFrom(tidyr,crossing)
328330
importFrom(tidyr,drop_na)
329331
importFrom(tidyr,expand_grid)
330332
importFrom(tidyr,fill)
333+
importFrom(tidyr,pivot_longer)
334+
importFrom(tidyr,pivot_wider)
331335
importFrom(tidyr,unnest)
332336
importFrom(tidyselect,all_of)
333337
importFrom(utils,capture.output)

R/epi_recipe.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -52,7 +52,7 @@ epi_recipe <- function(x, ...) {
5252
#' step_epi_lag(death_rate, lag = c(0, 7, 14)) %>%
5353
#' step_epi_ahead(death_rate, ahead = 7) %>%
5454
#' step_epi_lag(case_rate, lag = c(0, 7, 14)) %>%
55-
#' step_epi_naomit(all_predictors())
55+
#' step_epi_naomit()
5656
#'
5757
#' r
5858
epi_recipe.epi_df <- function(x,

R/flusight_hub_formatter.R

+1
Original file line numberDiff line numberDiff line change
@@ -55,6 +55,7 @@ abbr_to_location <- function(abbr) {
5555
#'
5656
#' @examples
5757
#' library(dplyr)
58+
#' library(epiprocess)
5859
#' weekly_deaths <- covid_case_death_rates %>%
5960
#' filter(
6061
#' time_value >= as.Date("2021-09-01"),

R/make_smooth_quantile_reg.R

-1
Original file line numberDiff line numberDiff line change
@@ -35,7 +35,6 @@
3535
#' qr_spec <- smooth_quantile_reg(quantile_levels = c(.2, .5, .8), outcome_locations = 20:1)
3636
#' tt <- qr_spec %>% fit_xy(x = XY[, 21:41], y = XY[, 1:20])
3737
#'
38-
#' library(dplyr)
3938
#' pl <- predict(
4039
#' object = tt,
4140
#' new_data = XY[max(which(complete.cases(XY[, 21:41]))), 21:41]

R/reexports.R

+8
Original file line numberDiff line numberDiff line change
@@ -54,6 +54,14 @@ tibble::as_tibble
5454
#' @export
5555
tibble::tibble
5656

57+
#' @importFrom tidyr pivot_longer
58+
#' @export
59+
tidyr::pivot_longer
60+
61+
#' @importFrom tidyr pivot_wider
62+
#' @export
63+
tidyr::pivot_wider
64+
5765
#' @importFrom tidyr unnest
5866
#' @export
5967
tidyr::unnest

man/epi_recipe.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/flusight_hub_formatter.Rd

+1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/reexports.Rd

+3-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/smooth_quantile_reg.Rd

-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)