library(readxl)
library(writexl)
library(ggplot2)
datos1=read_excel("industria.xlsx")
datos1
## # A tibble: 45 Ɨ 1
##    industria
##        <dbl>
##  1 12777053.
##  2 12710459.
##  3 12019393.
##  4 11475314.
##  5 11448839.
##  6 11340823.
##  7 10834198.
##  8 11068949.
##  9 11387452.
## 10 11876190.
## # ℹ 35 more rows
head(datos1,3)
## # A tibble: 3 Ɨ 1
##   industria
##       <dbl>
## 1 12777053.
## 2 12710459.
## 3 12019393.
d1s=ts(datos1,start=1980,frequency = 1)
plot(d1s)

d1sw=HoltWinters(d1s,gamma = F)
d1sp=predict(d1sw,3)
d1sp
## Time Series:
## Start = 2025 
## End = 2027 
## Frequency = 1 
##           fit
## [1,] 40770017
## [2,] 41608029
## [3,] 42446041
plot(d1sw,d1sp,main = "industria: 1980:2024")

Interpretation

Esta grafica es de una serie temporal, tambien tiene tendencia ascendente, no es estacional y la grafica es de un modelo aditivo.

Periodo=seq(1980,2027,1)
Industria=rbind(d1s,d1sp)
Dato=c(rep("Real",45),rep("pronostico",3))
Datos_oferta=data.frame(Periodo,Industria,Dato)
write_xlsx(Datos_oferta,"industria_pronostico.xlsx")
ggplot(Datos_oferta,aes(x=Periodo,y=Industria,col=Dato))+geom_line()+geom_point()+theme_bw()

Interpretation

este grafico es de serie temporal, tiene tendencia ascendente y el pronostico en los siguientes 3 aƱos es ascendente.