Hi,
I've updated R recently, and I was trying to execute the code from "Forecasting: Principles and Practice" on section 5.4:
# Re-index based on trading days
google_stock <- tsibbledata::gafa_stock %>%
filter(Symbol == "GOOG") %>%
mutate(day = row_number()) %>%
update_tsibble(index = day, regular = TRUE)
# Filter the year of interest
google_2015 <- google_stock %>% filter(year(Date) == 2015)
google_2015 %>% model(NAIVE(Close)) %>% gg_tsresiduals()
But I am getting an error:
<error/vctrs_error_incompatible_op>
<interval> + <integer> is not permitted
Backtrace:
1. fabletools::model(., NAIVE(Close))
9. feasts::gg_tsresiduals(.)
10. feasts::gg_tsdisplay(...)
12. feasts:::autoplot.tbl_cf(ACF(data, !!y, lag_max = lag_max))
18. inum:::format.interval(interval)
19. vctrs:::`+.vctrs_vctr`(x, 1L)
21. vctrs:::vec_arith.default("+", e1, e2)
22. vctrs::stop_incompatible_op(op, x, y)
23. vctrs:::stop_incompatible(...)
24. vctrs:::stop_vctrs(...)
Any idea how can I make it work?