Skip to content

Commit

Permalink
Check fixes
Browse files Browse the repository at this point in the history
  • Loading branch information
mitchelloharawild committed Mar 23, 2023
1 parent 8542696 commit ba3fe3f
Show file tree
Hide file tree
Showing 7 changed files with 9 additions and 8 deletions.
2 changes: 1 addition & 1 deletion R/broom.R
Original file line number Diff line number Diff line change
Expand Up @@ -24,7 +24,7 @@ augment.mdl_df <- function(x, ...){
kv <- key_vars(x)
x <- mutate(as_tibble(x),
dplyr::across(all_of(mbl_vars), function(x) lapply(x, augment, ...)))
x <- pivot_longer(x, mbl_vars, names_to = ".model", values_to = ".aug")
x <- pivot_longer(x, all_of(mbl_vars), names_to = ".model", values_to = ".aug")
unnest_tsbl(x, ".aug", parent_key = c(kv, ".model"))
}

Expand Down
2 changes: 1 addition & 1 deletion R/mable.R
Original file line number Diff line number Diff line change
Expand Up @@ -164,7 +164,7 @@ select.mdl_df <- function (.data, ...){
transmute.mdl_df <- function (.data, ...){
nm <- names(enquos(..., .named = TRUE))
res <- mutate(.data, ...)
select(res, !!nm)
select(res, all_of(nm))
}

#' @export
Expand Down
6 changes: 3 additions & 3 deletions R/plot.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
#'
#' @param object A tsibble.
#' @param .vars A bare expression containing data you wish to plot. Multiple variables can be plotted using [`ggplot2::vars()`].
#' @param ... Further arguments passed to [`ggplot2::geom_line()`], which can be used to specify fixed aesthetics such as `colour = "red"` or `size = 3`.
#' @param ... Further arguments passed to [`ggplot2::geom_line()`], which can be used to specify fixed aesthetics such as `colour = "red"` or `linewidth = 3`.
#'
#' @examplesIf requireNamespace("fable", quietly = TRUE)
#' library(fable)
Expand Down Expand Up @@ -141,7 +141,7 @@ If you're using it to extract intervals, consider using `hilo()` to compute inte
#' @param data A tsibble with the same key structure as the fable.
#' @param level The confidence level(s) for the plotted intervals.
#' @param show_gap Setting this to `FALSE` will connect the most recent value in `data` with the forecasts.
#' @param ... Further arguments passed used to specify fixed aesthetics for the forecasts such as `colour = "red"` or `size = 3`.
#' @param ... Further arguments passed used to specify fixed aesthetics for the forecasts such as `colour = "red"` or `linewidth = 3`.
#' @param point_forecast The point forecast measure to be displayed in the plot.
#'
#' @examplesIf requireNamespace("fable", quietly = TRUE) && requireNamespace("tsibbledata", quietly = TRUE)
Expand Down Expand Up @@ -463,7 +463,7 @@ autoplot.dcmp_ts <- function(object, .vars = NULL, scale_bars = TRUE,
p <- p + geom_rect(data = range_data,
aes(ymin = !!sym("ymin"), ymax = !!sym("ymax"),
xmin = !!sym("xmin"), xmax = !!sym("xmax")),
fill = "gray75", colour = "black", size = 1 / 3
fill = "gray75", colour = "black", linewidth = 1 / 3
)
}

Expand Down
1 change: 1 addition & 0 deletions inst/WORDLIST
Original file line number Diff line number Diff line change
Expand Up @@ -8,6 +8,7 @@ MAAPE
MASE
MatrixM
MinT
ORCID
Sungil
Wickramasuriya
backtransform
Expand Down
2 changes: 1 addition & 1 deletion man/autoplot.dcmp_ts.Rd

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

2 changes: 1 addition & 1 deletion man/autoplot.fbl_ts.Rd

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

2 changes: 1 addition & 1 deletion man/autoplot.tbl_ts.Rd

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

0 comments on commit ba3fe3f

Please sign in to comment.