Skip to content

Commit

Permalink
Merge pull request #499 from spsanderson/development
Browse files Browse the repository at this point in the history
towards #477
  • Loading branch information
spsanderson authored Oct 31, 2023
2 parents 1353f0e + a5fd99c commit bba2ea5
Show file tree
Hide file tree
Showing 67 changed files with 263 additions and 106 deletions.
5 changes: 4 additions & 1 deletion R/augment-ts-acceleration.R
Original file line number Diff line number Diff line change
Expand Up @@ -38,8 +38,11 @@
#' @return
#' A augmented tibble
#'
#' @name ts_acceleration_augment
NULL

#' @export
#
#' @rdname ts_acceleration_augment

ts_acceleration_augment <- function(.data
, .value
Expand Down
7 changes: 5 additions & 2 deletions R/augment-ts-velocity.R
Original file line number Diff line number Diff line change
Expand Up @@ -36,10 +36,13 @@
#' ts_velocity_augment(data_tbl, b)
#'
#' @return
#' A augmented tibble
#' A augmented
#'
#' @name ts_velocity_augment
NULL

#' @export
#
#' @rdname ts_velocity_augment

ts_velocity_augment <- function(.data, .value, .names = "auto"){

Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-autoarima-xgboost.R
Original file line number Diff line number Diff line change
Expand Up @@ -68,9 +68,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_arima_xgboost
NULL

#' @export
#'
#' @rdname ts_auto_arima_xgboost

ts_auto_arima_xgboost <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_arima_boost", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-autoarima.R
Original file line number Diff line number Diff line change
Expand Up @@ -68,9 +68,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_arima
NULL

#' @export
#'
#' @rdname ts_auto_arima

ts_auto_arima <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_arima", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-croston.R
Original file line number Diff line number Diff line change
Expand Up @@ -70,9 +70,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_croston
NULL

#' @export
#'
#' @rdname ts_auto_croston

ts_auto_croston <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_croston", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-exp-smoothing.R
Original file line number Diff line number Diff line change
Expand Up @@ -69,9 +69,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_exp_smoothing
NULL

#' @export
#'
#' @rdname ts_auto_exp_smoothing

ts_auto_exp_smoothing <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_exp_smooth", .tune = TRUE, .grid_size = 20,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-glmnet.R
Original file line number Diff line number Diff line change
Expand Up @@ -66,9 +66,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_glmnet
NULL

#' @export
#'
#' @rdname ts_auto_glmnet

ts_auto_glmnet <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_glmnet", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-lm.R
Original file line number Diff line number Diff line change
Expand Up @@ -54,9 +54,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_lm
NULL

#' @export
#'
#' @rdname ts_auto_lm

ts_auto_lm <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_lm", .bootstrap_final = FALSE){
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-mars.R
Original file line number Diff line number Diff line change
Expand Up @@ -66,9 +66,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_mars
NULL

#' @export
#'
#' @rdname ts_auto_mars

ts_auto_mars <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_mars", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-nnetar.R
Original file line number Diff line number Diff line change
Expand Up @@ -66,9 +66,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_nnetar
NULL

#' @export
#'
#' @rdname ts_auto_nnetar

ts_auto_nnetar <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_nnetar", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-prophet-reg.R
Original file line number Diff line number Diff line change
Expand Up @@ -66,9 +66,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_prophet_reg
NULL

#' @export
#'
#' @rdname ts_auto_prophet_reg

ts_auto_prophet_reg <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_prophet_reg", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-prophet-xgboost.R
Original file line number Diff line number Diff line change
Expand Up @@ -67,9 +67,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_prophet_boost
NULL

#' @export
#'
#' @rdname ts_auto_prophet_boost

ts_auto_prophet_boost <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_prophet_boost", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-smooth-es.R
Original file line number Diff line number Diff line change
Expand Up @@ -69,9 +69,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_smooth_es
NULL

#' @export
#'
#' @rdname ts_auto_smooth_es

ts_auto_smooth_es <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_smooth_es", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-svm-poly.R
Original file line number Diff line number Diff line change
Expand Up @@ -68,9 +68,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_svm_poly
NULL

#' @export
#'
#' @rdname ts_auto_svm_poly

ts_auto_svm_poly <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_svm_poly", .tune = TRUE, .grid_size = 10,
Expand Down
6 changes: 4 additions & 2 deletions R/boilerplate-svm-rbf.R
Original file line number Diff line number Diff line change
Expand Up @@ -68,9 +68,11 @@
#'
#' @return
#' A list
#'
#' @name ts_auto_svm_rbf
NULL

#' @export
#'
#' @rdname ts_auto_svm_rbf

ts_auto_svm_rbf <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_svm_rbf", .tune = TRUE, .grid_size = 10,
Expand Down
5 changes: 4 additions & 1 deletion R/boilerplate-theta.R
Original file line number Diff line number Diff line change
Expand Up @@ -56,8 +56,11 @@
#' @return
#' A list
#'
#' @name ts_auto_theta
NULL

#' @export
#'
#' @rdname ts_auto_theta

ts_auto_theta <- function(.data, .date_col, .value_col, .rsamp_obj,
.prefix = "ts_theta", .bootstrap_final = FALSE){
Expand Down
5 changes: 4 additions & 1 deletion R/boilerplate-xgboost.R
Original file line number Diff line number Diff line change
Expand Up @@ -64,8 +64,11 @@
#' @return
#' A list
#'
#' @name ts_auto_xgboost
NULL

#' @export
#'
#' @rdname ts_auto_xgboost

ts_auto_xgboost <- function(.data, .date_col, .value_col, .formula, .rsamp_obj,
.prefix = "ts_xgboost", .tune = TRUE, .grid_size = 10,
Expand Down
8 changes: 4 additions & 4 deletions R/calibrate-plot-list.R
Original file line number Diff line number Diff line change
Expand Up @@ -65,11 +65,11 @@
#'
#' @return
#' The original time series, the simulated values and a some plots
#'
#' @name calibrate_and_plot
NULL

#' @export calibrate_and_plot
#'
# *** PLOTTING UTILITY *** ----
# - Calibrate & Plot
#' @rdname calibrate_and_plot
calibrate_and_plot <- function(..., .type = "testing", .splits_obj
, .data, .print_info = TRUE
, .interactive = FALSE){
Expand Down
12 changes: 8 additions & 4 deletions R/diagnostic_plots.R
Original file line number Diff line number Diff line change
Expand Up @@ -30,9 +30,11 @@
#'
#' @return
#' A `ggplot2` layers object
#'
#' @name ts_random_walk_ggplot_layers
NULL

#' @export
#'
#' @rdname ts_random_walk_ggplot_layers

# Function for obtaining ggplot layers to commonly apply to subsequent plots
ts_random_walk_ggplot_layers <- function(.data) {
Expand Down Expand Up @@ -128,9 +130,11 @@ ts_random_walk_ggplot_layers <- function(.data) {
#'
#' @return
#' A static ggplot2 graph or if .interactive is set to TRUE a plotly plot
#'
#' @name ts_qc_run_chart
NULL

#' @export
#'
#' @rdname ts_qc_run_chart

ts_qc_run_chart <- function(.data, .date_col, .value_col, .interactive = FALSE,
.median = TRUE, .cl = TRUE, .mcl = TRUE, .ucl = TRUE,
Expand Down
6 changes: 4 additions & 2 deletions R/helper-model-extraction.R
Original file line number Diff line number Diff line change
Expand Up @@ -29,9 +29,11 @@
#' }
#'
#' @return A model description
#'
#' @name model_extraction_helper
NULL

#' @export
#'
#' @rdname model_extraction_helper

model_extraction_helper <- function(.fit_object){

Expand Down
6 changes: 4 additions & 2 deletions R/internal-event-backward.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,9 +16,11 @@
#'
#' @return
#' A tibble.
#'
#' @name internal_ts_backward_event_tbl
NULL

#' @export
#'
#' @rdname internal_ts_backward_event_tbl

internal_ts_backward_event_tbl <- function(.data, .horizon){

Expand Down
6 changes: 4 additions & 2 deletions R/internal-event-both.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,9 +16,11 @@
#'
#' @return
#' A tibble.
#'
#' @name internal_ts_both_event_tbl
NULL

#' @export
#'
#' @rdname internal_ts_both_event_tbl

internal_ts_both_event_tbl <- function(.data, .horizon){

Expand Down
6 changes: 4 additions & 2 deletions R/internal-event-forward.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,9 +16,11 @@
#'
#' @return
#' A tibble.
#'
#' @name internal_ts_forward_event_tbl
NULL

#' @export
#'
#' @rdname internal_ts_forward_event_tbl

internal_ts_forward_event_tbl <- function(.data, .horizon){

Expand Down
6 changes: 4 additions & 2 deletions R/simulate-ts-arima.R
Original file line number Diff line number Diff line change
Expand Up @@ -43,9 +43,11 @@
#'
#' @return
#' A list object.
#'
#' @name ts_arima_simulator
NULL

#' @export
#'
#' @rdname ts_arima_simulator

ts_arima_simulator <- function(.n = 100, .num_sims = 25, .order_p = 0,
.order_d = 0, .order_q = 0, .ma = c(), .ar = c(),
Expand Down
5 changes: 4 additions & 1 deletion R/step-ts-acceleration.R
Original file line number Diff line number Diff line change
Expand Up @@ -73,8 +73,11 @@
#'
#' rec_obj %>% prep() %>% juice()
#'
#' @name step_ts_acceleration
NULL

#' @export
#'
#' @rdname step_ts_acceleration
#' @importFrom recipes prep bake rand_id

step_ts_acceleration <- function(recipe,
Expand Down
6 changes: 4 additions & 2 deletions R/step-ts-velocity.R
Original file line number Diff line number Diff line change
Expand Up @@ -72,9 +72,11 @@
#' bake(prep(rec_obj), data_tbl)
#'
#' rec_obj %>% prep() %>% juice()
#'
#' @name step_ts_velocity
NULL

#' @export
#'
#' @rdname step_ts_velocity
#' @importFrom recipes prep bake rand_id

step_ts_velocity <- function(recipe,
Expand Down
6 changes: 4 additions & 2 deletions R/tidy-fft.R
Original file line number Diff line number Diff line change
Expand Up @@ -82,9 +82,11 @@
#'
#' @return
#' A list object returned invisibly.
#'
#' @name tidy_fft
NULL

#' @export
#'
#' @rdname tidy_fft

tidy_fft <- function(.data, .date_col, .value_col, .frequency = 12L,
.harmonics = 1L, .upsampling = 10L){
Expand Down
Loading

0 comments on commit bba2ea5

Please sign in to comment.