diff --git a/R/accessors.R b/R/accessors.R index 49e733da..9b3708a4 100644 --- a/R/accessors.R +++ b/R/accessors.R @@ -54,4 +54,4 @@ mable_vars <- function(x){ #' @export mable_vars.mdl_df <- function(x){ x%@%"model" -} \ No newline at end of file +} diff --git a/R/accuracy.R b/R/accuracy.R index b4467a6c..92b34475 100644 --- a/R/accuracy.R +++ b/R/accuracy.R @@ -638,4 +638,4 @@ accuracy.fbl_ts <- function(object, data, measures = point_accuracy_measures, .. .accuracy = measures ) %>% unnest_tbl(".accuracy") -} \ No newline at end of file +} diff --git a/R/aggregate.R b/R/aggregate.R index 87f10407..1236a87a 100644 --- a/R/aggregate.R +++ b/R/aggregate.R @@ -401,4 +401,4 @@ scale_type.agg_vec <- function(x) { # out[names(dots)[[i]]] <- res # } # out -# } \ No newline at end of file +# } diff --git a/R/box_cox.R b/R/box_cox.R index 0aa5921b..f0ca3bc5 100644 --- a/R/box_cox.R +++ b/R/box_cox.R @@ -43,4 +43,4 @@ inv_box_cox <- function(x, lambda) { z <- x[!lambda_0] * lambda[!lambda_0] + 1 x[!lambda_0] <- sign(z) * abs(z) ^ (1 / lambda[!lambda_0]) x -} \ No newline at end of file +} diff --git a/R/components.R b/R/components.R index 03af7d01..cfaa8844 100644 --- a/R/components.R +++ b/R/components.R @@ -38,4 +38,4 @@ components.mdl_df <- function(object, ...){ #' @export components.mdl_ts <- function(object, ...){ components(object$fit, ...) -} \ No newline at end of file +} diff --git a/R/dable.R b/R/dable.R index f8bb27f5..54f74fd4 100644 --- a/R/dable.R +++ b/R/dable.R @@ -129,4 +129,4 @@ combine_dcmp_attr <- function(lst_dcmp){ list(response = resp[[1]], method = paste0(unique(method), collapse = " & "), seasons = strc, aliases = aliases) -} \ No newline at end of file +} diff --git a/R/dplyr-fable.R b/R/dplyr-fable.R index 46905b81..a777b07a 100644 --- a/R/dplyr-fable.R +++ b/R/dplyr-fable.R @@ -48,4 +48,4 @@ summarise.fbl_ts <- function(.data, ..., .groups = NULL) { } #' @export -summarise.grouped_fbl <- summarise.fbl_ts \ No newline at end of file +summarise.grouped_fbl <- summarise.fbl_ts diff --git a/R/equation.R b/R/equation.R index ac79f255..8282be53 100644 --- a/R/equation.R +++ b/R/equation.R @@ -12,4 +12,4 @@ equation.mdl_ts <- function(object, ...){ abort("Cannot display equations containing transformations.") } equation(object[["fit"]]) -} \ No newline at end of file +} diff --git a/R/fable.R b/R/fable.R index 97a32e5f..f1b2de31 100644 --- a/R/fable.R +++ b/R/fable.R @@ -282,4 +282,4 @@ rbind.fbl_ts <- function(...){ type_sum.fbl_ts <- function(x){ "fable" -} \ No newline at end of file +} diff --git a/R/fabletools-package.R b/R/fabletools-package.R index 330058c5..781bdae8 100644 --- a/R/fabletools-package.R +++ b/R/fabletools-package.R @@ -16,4 +16,4 @@ globalVariables(".") #' @importFrom tidyselect all_of #' @importFrom lifecycle deprecate_warn deprecated ## usethis namespace: end -NULL \ No newline at end of file +NULL diff --git a/R/features.R b/R/features.R index fa34522e..29ea59f2 100644 --- a/R/features.R +++ b/R/features.R @@ -339,4 +339,4 @@ NULL #' #' @keywords internal #' @name features_by_tag -NULL \ No newline at end of file +NULL diff --git a/R/fitted.R b/R/fitted.R index af534d3f..9b83d778 100644 --- a/R/fitted.R +++ b/R/fitted.R @@ -78,4 +78,4 @@ hfitted.mdl_ts <- function(object, h, ...) { fits <- map2(bt, split(fits, col(fits)), function(bt, fit) bt(fit)) } fits -} \ No newline at end of file +} diff --git a/R/forecast.R b/R/forecast.R index b4715a28..16808e78 100644 --- a/R/forecast.R +++ b/R/forecast.R @@ -287,4 +287,4 @@ scenarios <- function(..., names_to = ".scenario"){ structure(list2( ... ), names_to = names_to) -} \ No newline at end of file +} diff --git a/R/frequency.R b/R/frequency.R index 378a6967..ef8e46f3 100644 --- a/R/frequency.R +++ b/R/frequency.R @@ -107,4 +107,4 @@ get_frequencies.Period <- function(period, data, ...){ lubridate::microseconds(microsecond) + lubridate::nanoseconds(nanosecond)) suppressMessages(period / interval) -} \ No newline at end of file +} diff --git a/R/generate.R b/R/generate.R index 142b26a2..d1e7c3c2 100644 --- a/R/generate.R +++ b/R/generate.R @@ -17,7 +17,7 @@ #' @param seed The seed for the random generation from distributions. #' @param ... Additional arguments for individual simulation methods. #' -#' @examplesIf requireNamespace("fable", quietly = TRUE) +#' @examplesIf requireNamespace("fable quietly = TRUE) #' library(fable) #' library(dplyr) #' UKLungDeaths <- as_tsibble(cbind(mdeaths, fdeaths), pivot_longer = FALSE) @@ -145,4 +145,4 @@ block_bootstrap <- function (n, window_size, size = n) { } start_from <- sample.int(window_size, 1) bx[seq(start_from, length.out = size)] -} \ No newline at end of file +} diff --git a/R/guess.R b/R/guess.R index 811de28e..a6178628 100644 --- a/R/guess.R +++ b/R/guess.R @@ -14,4 +14,4 @@ guess_response <- function(.data){ expr_name(out) )) out -} \ No newline at end of file +} diff --git a/R/hypothesise.R b/R/hypothesise.R index 8441f968..7d7ca49c 100644 --- a/R/hypothesise.R +++ b/R/hypothesise.R @@ -36,4 +36,4 @@ hypothesize.mdl_ts <- function(x, tests = list(), ...){ !!!map(tests, calc, x$fit, ...), .names_to = ".test" ) -} \ No newline at end of file +} diff --git a/R/interpolate.R b/R/interpolate.R index 32f1836d..27e34cf3 100644 --- a/R/interpolate.R +++ b/R/interpolate.R @@ -64,4 +64,4 @@ Does your interpolation data include all variables required by the model?", e$me new_data[names(resp)] <- map2(new_data[names(resp)], object$transformation, function(x, f) invert_transformation(f)(x)) new_data -} \ No newline at end of file +} diff --git a/R/lst_mdl.R b/R/lst_mdl.R index ebd3d41d..df186723 100644 --- a/R/lst_mdl.R +++ b/R/lst_mdl.R @@ -25,4 +25,4 @@ vec_cast.lst_mdl.lst_mdl <- function(x, to, ...){ abort("Cannot combine model lists with different reconciliation strategies.") } x -} \ No newline at end of file +} diff --git a/R/mdl_ts.R b/R/mdl_ts.R index def539fd..7ac44324 100644 --- a/R/mdl_ts.R +++ b/R/mdl_ts.R @@ -41,4 +41,4 @@ model_sum.default <- function(x){ #' @export model_sum.mdl_ts <- function(x){ model_sum(x[["fit"]]) -} \ No newline at end of file +} diff --git a/R/model.R b/R/model.R index a29b63a4..6d2b6bcc 100644 --- a/R/model.R +++ b/R/model.R @@ -183,4 +183,4 @@ model_rhs <- function(model){ else{ expr(NULL) } -} \ No newline at end of file +} diff --git a/R/model_combination.R b/R/model_combination.R index 15c76d92..94544130 100644 --- a/R/model_combination.R +++ b/R/model_combination.R @@ -353,4 +353,4 @@ residuals.model_combination <- function(object, type = "response", ...) { object[mdls] <- map(object[mdls], residuals, type = "response", ...) res <- map(object, function(x) if(is_tsibble(x)) x[[".resid"]] else x) eval_tidy(expr, res) -} \ No newline at end of file +} diff --git a/R/model_null.R b/R/model_null.R index 47c538a4..9e2abe87 100644 --- a/R/model_null.R +++ b/R/model_null.R @@ -106,4 +106,4 @@ model_sum.null_mdl <- function(x){ "NULL model" } #' @export -report.NULL <- report.null_mdl \ No newline at end of file +report.NULL <- report.null_mdl diff --git a/R/outliers.R b/R/outliers.R index 53364a74..f4eee010 100644 --- a/R/outliers.R +++ b/R/outliers.R @@ -26,4 +26,4 @@ outliers.mdl_df <- function(object, ...){ #' @export outliers.mdl_ts <- function(object, ...){ object$data[outliers(object$fit, ...),] -} \ No newline at end of file +} diff --git a/R/parse.R b/R/parse.R index b1cd0765..03a4c8cf 100644 --- a/R/parse.R +++ b/R/parse.R @@ -296,4 +296,4 @@ Please specify a valid form of your transformation using `new_transformation()`. response = syms(responses), transformation = transformations ) -} \ No newline at end of file +} diff --git a/R/refit.R b/R/refit.R index 04e3cfd5..76c4dcbb 100644 --- a/R/refit.R +++ b/R/refit.R @@ -55,4 +55,4 @@ refit.mdl_ts <- function(object, new_data, ...){ object$fit <- refit(object[["fit"]], new_data, specials = specials, ...) object$data <- new_data object -} \ No newline at end of file +} diff --git a/R/report.R b/R/report.R index 2bb12d41..9f78211d 100644 --- a/R/report.R +++ b/R/report.R @@ -35,4 +35,4 @@ report.mdl_ts <- function(object, ...){ cat("\nA model specific report is not available for this model class.") } ) -} \ No newline at end of file +} diff --git a/R/residuals.R b/R/residuals.R index 10ad5c9c..33985437 100644 --- a/R/residuals.R +++ b/R/residuals.R @@ -51,4 +51,4 @@ Defaulting to `type="response"`', type, model_sum(object))) out <- object$data[index_var(object$data)] out[nm] <- .resid out -} \ No newline at end of file +} diff --git a/R/response.R b/R/response.R index 3864bdfd..5a5f33d0 100644 --- a/R/response.R +++ b/R/response.R @@ -38,4 +38,4 @@ response.mdl_ts <- function(object, ...){ out <- object$data[index_var(object$data)] out[if(length(resp) == 1) ".response" else mv] <- resp out -} \ No newline at end of file +} diff --git a/R/specials.R b/R/specials.R index b8ace5b2..211223f4 100644 --- a/R/specials.R +++ b/R/specials.R @@ -76,4 +76,4 @@ fable_xreg_matrix <- function(..., .data, default_intercept = TRUE) { return(matrix(data = 1, nrow = NROW(.data), dimnames = list(NULL, "(Intercept)"))) } mm -} \ No newline at end of file +} diff --git a/R/stream.R b/R/stream.R index 450b3f5c..0544421f 100644 --- a/R/stream.R +++ b/R/stream.R @@ -47,4 +47,4 @@ stream.mdl_ts <- function(object, new_data, ...){ object$fit <- stream(object[["fit"]], new_data, specials = specials, ...) object$data <- bind_rows(object$data, select(new_data, !!!syms(colnames(object$data)))) object -} \ No newline at end of file +} diff --git a/R/tbl_utils.R b/R/tbl_utils.R index 94d6ae60..4cfc2346 100644 --- a/R/tbl_utils.R +++ b/R/tbl_utils.R @@ -9,4 +9,4 @@ dim_tbl <- function (x){ dim_x <- dim(x) format_dim <- map_chr(dim_x, big_mark) paste(format_dim, collapse = " x ") -} \ No newline at end of file +} diff --git a/R/transform.R b/R/transform.R index 19cf1e54..e952e4ab 100644 --- a/R/transform.R +++ b/R/transform.R @@ -310,4 +310,4 @@ inverse_table$add("base", "(", function(operation, target, result){ call2("(", !!!exprs(!!result)) } -) \ No newline at end of file +) diff --git a/R/vctrs-dable.R b/R/vctrs-dable.R index d7b9c4c9..27042b8d 100644 --- a/R/vctrs-dable.R +++ b/R/vctrs-dable.R @@ -112,4 +112,4 @@ vec_cast.tbl_ts.dcmp_ts <- function(x, to, ...) { tbl, key = key_vars(to), index = index_var(to), index2 = index2_var(to), ordered = TRUE, validate = TRUE, .drop = key_drop_default(to) ) -} \ No newline at end of file +} diff --git a/R/vctrs-fable.R b/R/vctrs-fable.R index a5422b41..b4fa5b14 100644 --- a/R/vctrs-fable.R +++ b/R/vctrs-fable.R @@ -117,4 +117,4 @@ vec_restore.fbl_ts <- function(x, to, ..., n = NULL) { ordered = TRUE, validate = TRUE, .drop = key_drop_default(to)) } build_fable(x, response = response_vars(to), distribution = distribution_var(to)) -} \ No newline at end of file +} diff --git a/R/zzz.R b/R/zzz.R index 7d15b366..326ccf08 100644 --- a/R/zzz.R +++ b/R/zzz.R @@ -45,4 +45,4 @@ register_s3_method <- function(pkg, generic, class, fun = NULL) { } ) } -# nocov end \ No newline at end of file +# nocov end