Skip to content

Commit

Permalink
Remove conditional usage of feasts package
Browse files Browse the repository at this point in the history
  • Loading branch information
mitchelloharawild committed Sep 16, 2019
1 parent a6cbddd commit 1cc0140
Show file tree
Hide file tree
Showing 4 changed files with 1 addition and 9 deletions.
4 changes: 0 additions & 4 deletions R/arima.R
Original file line number Diff line number Diff line change
Expand Up @@ -463,14 +463,12 @@ specials_arima <- new_specials(
#' as_tsibble %>%
#' model(arima = ARIMA(log(value) ~ pdq(0,1,1) + PDQ(0,1,1)))
#'
#' if (requireNamespace("feasts", quietly = TRUE)) {
#' # Automatic ARIMA specification
#' library(tsibble)
#' library(dplyr)
#' tsibbledata::global_economy %>%
#' filter(Country == "Australia") %>%
#' model(ARIMA(log(GDP) ~ Population))
#' }
#'
#' @importFrom stats model.matrix
#' @export
Expand Down Expand Up @@ -703,13 +701,11 @@ refit.ARIMA <- function(object, new_data, specials = NULL, reestimate = FALSE, .
#' @return A tibble of the same dimension of `new_data` with missing values interpolated.
#'
#' @examples
#' if (requireNamespace("feasts", quietly = TRUE)) {
#' library(tsibbledata)
#'
#' olympic_running %>%
#' model(arima = ARIMA(Time ~ trend())) %>%
#' interpolate(olympic_running)
#' }
#'
#' @importFrom stats formula residuals
#' @export
Expand Down
2 changes: 1 addition & 1 deletion cran-comments.md
Original file line number Diff line number Diff line change
Expand Up @@ -14,7 +14,7 @@
## Re-submission

* Fixed URL in vignette.
* Updated tests and examples to conditionally depend on feasts.
* The 'feasts' package is now available on CRAN.
* Updated description to use '' for package names.
* Improved detail in package description to provide examples of included models.
* Removed author field from docs.
Expand Down
2 changes: 0 additions & 2 deletions man/ARIMA.Rd

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

2 changes: 0 additions & 2 deletions man/interpolate.ARIMA.Rd

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

0 comments on commit 1cc0140

Please sign in to comment.