Problems from Chapter 3 of Shumway and Stoffer s Book

Size: px
Start display at page:

Download "Problems from Chapter 3 of Shumway and Stoffer s Book"

Transcription

1 UNIVERSITY OF UTAH GUIDED READING TIME SERIES Problems from Chapter 3 of Shumway and Stoffer s Book Author: Curtis MILLER Supervisor: Prof. Lajos HORVATH November 10, 2015

2 UNIVERSITY OF UTAH DEPARTMENT OF MATHEMATICS ARIMA Models Curtis Miller November 10, ESTIMATION 1.1 AR(2) MODEL FOR cmort To estimate the AR(2) process, I first use ordinary least squares (OLS). I then use the Yule- Walker estimate. This is shown in the R code below: # OLS esimate # demean = T results in looking at cmort - mean(cmort) # intercept = F sets the intercept to 0 cmort.ar2.ols <- ar.ols(cmort, order = 2, demean = T) # Yule-Walker estimate cmort.ar2.yw <- ar.yw(cmort, order = 2, demean = T) PARAMETER ESTIMATE COMPARISON # OLS estimate cmort.ar2.ols Call: ar.ols(x = cmort, order.max = 2, demean = T) 2

3 Coefficients: Intercept: (0.2527) Order selected 2 sigma^2 estimated as # Yule-Walker estimate cmort.ar2.yw Call: ar.yw.default(x = cmort, order.max = 2, demean = T) Coefficients: Order selected 2 sigma^2 estimated as Looking at the coefficients of the AR(2) model estimated using the two methods, I see very little difference. OLS and Yule-Walker estimation produce similar results STANDARD ERROR COMPARISON # The standard error of the OLS estimates cmort.ar2.ols$asy.se.coef$ar [1] # The variance matrix of the Yule-Walker estimates cmort.ar2.yw$asy.var.coef [,1] [,2] [1,] [2,] # Corresponding standard error of both parameters sqrt(cmort.ar2.yw$asy.var.coef[1,1]) [1] Looking at the above R output, it appears that both models have the same standard error for the parameters. 3

4 First I generate the data: 1.2 AR(1) SIMULATION AND ESTIMATION ar1.sim <- arima.sim(n = 50, list(ar = c(.99), sd = c(1))) I first estimate the parameter from the simulation using the Yule-Walker estimate. ar1.sim.yw <- ar.yw(ar1.sim, order = 1) # Model estimates ar1.sim.yw Call: ar.yw.default(x = ar1.sim, order.max = 1) Coefficients: Order selected 1 sigma^2 estimated as # Model covariance matrix ar1.sim.yw$asy.var.coef [,1] [1,] Here, I would perform inference on the model by assuming it is Normally distributed. I would use the covariance matrix listed above for estimating the standard error. Bootstrap results in R could be done as follows: tsboot(ar1.sim, function(d) { return(ar.yw(d, order = 1)$ar) }, R = 2000) MODEL BASED BOOTSTRAP FOR TIME SERIES Call: tsboot(tseries = ar1.sim, statistic = function(d) { return(ar.yw(d, order = 1)$ar) }, R = 2000) 4

5 Bootstrap Statistics : original bias std. error t1* The bootstrap standard error is zero, while the theoretical standard error is non-zero. 2 INTEGRATED MODELS FOR NONSTATIONARY DATA 2.1 EWMA MODEL FOR GLACIAL VARVE DATA Here I am interested in the varve dataset. In fact, I am interested in analyzing log(v ar ve), since I believe this may actually be a stationary process. I will be estimating a EWMA model for this data. logvarve <- log(varve) # EWMA for logvarve with lambda =.25 logvarve.ima.25 <- HoltWinters(logvarve[1:100], alpha = , beta = FALSE, gamma = FALSE) logvarve.ima.5 <- HoltWinters(logvarve[1:100], alpha = 1 -.5, beta = FALSE, gamma = FALSE) logvarve.ima.75 <- HoltWinters(logvarve[1:100], alpha = , beta = FALSE, gamma = FALSE) # Plotting results par(mfrow = c(3,1)) plot(logvarve.ima.25, main = "EWMA Fit with Lambda =.25") plot(logvarve.ima.5, main = "EWMA Fit with Lambda =.5") plot(logvarve.ima.75, main = "EWMA Fit with Lambda =.75") The results are shown in 2.1. With a small smoothing parameter (λ), the results are very sensetive to the immediate past, while a high smoothing parameter leads to more stable predictions. 3 BUILDING ARIMA MODELS 5

6 EWMA Fit with Lambda =.25 Observed / Fitted Time EWMA Fit with Lambda =.5 Observed / Fitted Time EWMA Fit with Lambda =.75 Observed / Fitted Time Figure 2.1: EWMA fit for different smoothing parameters 6

7 3.1 AR(1) MODEL FOR GNP DATA Here I am investigating how well an AR(1) (or, more exactly, an ARIMA(1,1,0)) model fits the natural log of U.S. GNP data. I estimate this ARIMA model. gnpgr = diff(log(gnp)) # growth rate of GNP gnp.model <- sarima(gnpgr, 1, 0, 0, details = F) # AR(1) model fit I see disturbing trends in the diagnostic plots shown in Figure 3.1. The residual plot should look like white noise, but I see the variance decreasing as the year increases. The ACF is fine, but the Q-Q plot suggests non-normality. Fortunately, the ACF and p-values for Ljung- Box statistic look as they should be. Still, other models (probably ones that do not assume Gaussian white noise) may be better. 3.2 FITTING CRUDE OIL PRICES WITH AN ARIMA(p,d, q) MODEL My objective is to fit an ARIMA(p,d, q) model for the oil dataset. I start by examining the data: # Prepare layout old.par <- par(mar = c(0, 0, 0, 0), oma = c(4, 4, 1, 1), mfrow = c(4, 1), cex.axis =.75) plot(oil, xaxt = 'n'); mtext(text = "Oil Price", side = 2, line = 2, cex =.75) plot(log(oil), xaxt = 'n'); mtext(text = "Natural Logarithm of Oil Price", side = 2, line = 2, cex =.75) plot(diff(oil), xaxt = 'n'); mtext(text = "First Difference in Oil Price", side = 2, line = 2, cex =.75) plot(diff(log(oil))); mtext(text = "Percent Change in Oil Price", side = 2, line = 2, cex =.75) The first plot in Figure 3.2 shows that oil prices clearly are not a stationary process, and it appears that the variance of the process increases with time. Taking the natural log of oil prices helps control the increasing variability, but not the nonstationary behavior of the series. When looking at the change in oil price from one period to the next, I do see a process that looks more stationary, but the nonconstant variance is not removed. The final attempt is to look at the differences in the natural log of oil prices (which can be interpreted as the percentage change in oil prices). This appears to be stationary and with a mostly constant variance. However, there are large deviations around 2009, and even prior, that would lead one to conclude that the white noise is not Gaussian, which threatens estimation and inference. I now look at the ACF and PACF of log(oil t ): 7

8 Standardized Residuals Time ACF of Residuals Normal Q Q Plot of Std Residuals ACF Sample Quantiles LAG Theoretical Quantiles p values for Ljung Box statistic p value lag Figure 3.1: Diagnostic plots for the AR(1) model 8

9 Percent Change in Oil Price First Difference in Oil Price Natural Logarithm of Oil Price Oil Price Figure 3.2: Basic plots of the oil series 9

10 par(mar = c(0, 0, 0, 0), oma = c(4, 4, 1, 1), mfrow = c(2, 1), cex.axis =.75) acf(diff(log(oil)), xaxt = 'n'); mtext(text = "Sample ACF", side = 2, line = 2) pacf(diff(log(oil))); mtext(text = "Sample PACF", side = 2, line = 2) When looking at the sample PACF in Figure 3.3, I see that the PACF is nonzero as far out as eight lags, which may suggest that p = = 9, or that we should consider lagging the AR term out to as far as nine lags. # noquote(capture.output(), "") used only to make presentation # easier write(capture.output(sarima(log(oil), p = 9, d = 1, q = 0))[32:38],"") Coefficients: ar1 ar2 ar3 ar4 ar5 ar s.e ar7 ar8 ar9 constant The ninth lag does not appear statistically significant, so I drop the number of lags down to eight. I now use the following ARIMA model (with diagnostic plots shown): oil.model <- sarima(log(oil), p = 8, d = 1, q = 0, details = F) write(capture.output(oil.model)[8:14], "") Coefficients: ar1 ar2 ar3 ar4 ar5 ar s.e ar7 ar8 constant s.e The residuals clearly do not appear to be Gaussian; there are large price movements that make this assumption doubtful, and the Q-Q plot does not support the Normality assumption. The ACF of the residuals can get large for some distant lags but otherwise are within the band of reasonable values. The p-values of the Ljung-Box statistics suggest that we do not have dependence in our residuals for large lags. This may be the best fit an ARIMA model can provide. 10

11 Sample PACF Sample ACF Figure 3.3: Sample ACF and PACF for percentage change in oil price 11

12 Standardized Residuals Time ACF of Residuals Normal Q Q Plot of Std Residuals ACF Sample Quantiles LAG Theoretical Quantiles p values for Ljung Box statistic p value lag Figure 3.4: Diagnostic plots for the ARIMA(8,1,0) model for the log(oil) series 12

13 4 REGRESSION WITH AUTOCORRELATED ERRORS 4.1 MONTHLY SALES DATA ARIMA MODEL FITTING The problem first asks for an ARIMA model for the sales data series. I first plot the series. par(mar = c(0, 0, 0, 0), oma = c(4, 4, 1, 1), mfrow = c(3, 1), cex.axis =.75) plot(sales, xaxt = 'n'); mtext(text = "Sales", side = 2, line = 2, cex =.75) plot(diff(sales), xaxt = 'n') mtext(text = "First Order Difference in Sales", side = 2, line = 2, cex =.75) plot(diff(diff(sales))); mtext(text = "Second Order Difference in Sales", side = 2, line = 2, cex =.75) Figure 4.1 shows the plots of the sales series. Clearly, sales t is not stationary. Surprisingly, neither is sales t ; this series shows periodicity. It takes a second-order differencing, ( sales t ), to find a stationary series. I next examine the ACF and PACF functions to try and identify the order of the AR and MA terms. par(mar = c(0, 0, 0, 0), oma = c(4, 4, 1, 1), mfrow = c(2, 1), cex.axis =.75) acf(diff(diff(sales)), xaxt = 'n'); mtext(text = "Sample ACF", side = 2, line = 2) pacf(diff(diff(sales))); mtext(text = "Sample PACF", side = 2, line = 2) As shown in Figure 4.2, the sample ACF cuts off after one lag and the sample PACF appears to be trailing off, so I believe that an ARIMA(0,2,1) should provide a good fit for the data. par(old.par) oil.model <- sarima(sales, p = 0, d = 2, q = 1, details = F) write(capture.output(oil.model)[8:14], "") Coefficients: ma s.e sigma^2 estimated as 1.866: log likelihood = , aic =

14 Second Order Difference in Sales First Order Difference in Sales Sales Figure 4.1: Basic plots of the sales series 14

15 Sample PACF Sample ACF Figure 4.2: Sample ACF and PACF for second order difference in sales 15

16 Standardized Residuals Time ACF of Residuals Normal Q Q Plot of Std Residuals ACF Sample Quantiles LAG Theoretical Quantiles p values for Ljung Box statistic p value lag Figure 4.3: Diagnostic plots for the ARIMA(0,2,1) model for the sales series 16

17 Looking at the diagnostic plots in Figure 4.3, the ARIMA(0,2,1) seems to fit well. The error terms appear Gaussian, there are no strong autocorrelations in the residuals, and the error terms do not appear to be dependent RELATIONSHIP BETWEEN sales AND lead I examine the CCF of sales and lead and a lag plot of sales t and lead t 3 to determine if a regression involving these variables is reasonable. ccf(diff(sales), diff(lead), main = "CCF of sales and lead") As seen in Figure 4.4, while sales and lead are often uncorrelated, around lag 3 they become highly correlated. This fact is emphasized by a lag plot. lag2.plot(lead, sales, max.lag = 3) Figure 4.5 shows a linear relationship with a third lag of lead and contemporary sales. This would justify regressing sales t on lead t REGRESSION WITH ARMA ERRORS Given that the variable lead seems to provide useful information about sales, I try to regress sales on lead. More specifically, I try to regress sales t on lead t 3, while viewing the error term as being some unknown ARMA process. saleslead <- ts.intersect(diff(sales), lag(diff(lead), k = -3)) salesnew <- saleslead[,1] leadnew <- saleslead[,2] fit <- lm(salesnew ~ leadnew) acf2(resid(fit)) ACF PACF [1,] [2,] [3,] [4,] [5,] [6,] [7,] [8,] [9,] [10,] [11,]

18 CCF of sales and lead ACF Lag Figure 4.4: CCF of sales and lead 18

19 lead(t 0) lead(t 1) sales(t) sales(t) lead(t 2) lead(t 3) sales(t) sales(t) Figure 4.5: Lag plot of sales and lead 19

20 Series: resid(fit) ACF LAG PACF LAG Figure 4.6: Sample ACF and PACF for residuals from linear fit 20

21 [12,] [13,] [14,] [15,] [16,] [17,] [18,] [19,] [20,] [21,] [22,] [23,] Figure 4.6 shows the ACF and the PACF of the residuals of the "naïve" fit. The PACF cuts off at 1 and the ACF trails off, so this appears to be an AR(1) process. arima.fit <- sarima(salesnew, 1, 0, 0, xreg=cbind(leadnew), details = F) As shown in Figure 4.7, the diagnostic plots for the process, when interpreting the error terms as an ARMA(1,0) process, look very good. Normality of the white noise residuals, the ACF of the white noise residuals, and the tests of dependence all show desirable properties. stargazer(arima.fit$fit, covariate.labels = c("$\\phi$", "Intercept", "$\\Delta \\text{lead}_{t-3}$"), dep.var.labels = c("$\\delta \\text{sales}_t$"), label = "tab:prob35h", title = "Coefficients of the model for $\\Delta \\text{sales}_t$", table.placement = "ht") Table 4.1 shows the estimates of the coefficients of the model. The AR(1) term (φ) is statistically significant and so is the intercept and the coefficient of the lead t 3 term. 5 MULTIPLICATIVE SEASONAL ARIMA MODELS 5.1 ACF OF AN ARIMA(p,d, q) (P,D,Q) s MODEL The problem asks for a plot of the theoretical ACF of an ARIMA(1,0,0) (0,0,1) 1 2 model, with Φ = 0.8 and θ = 0.5. This model is: The ACF is computed and plotted below: x t =.8x t 12 + w t +.5w t 1 (5.1) 21

22 Standardized Residuals Time ACF of Residuals Normal Q Q Plot of Std Residuals ACF Sample Quantiles LAG Theoretical Quantiles p values for Ljung Box statistic p value lag Figure 4.7: Diagnostic plots for the model for the sales series with ARMA(1,0) error terms 22

23 Table 4.1: Coefficients of the model for sales t Dependent variable: φ Intercept lead t 3 sales t (0.063) (0.177) (0.143) Observations 146 Log Likelihood σ Akaike Inf. Crit Note: p<0.1; p<0.05; p<0.01 ACF <- ARMAacf(ar = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,.8), ma = c(.5)) plot(acf, type = "h", xlab = "lag", xlim = c(1, 15), ylim = c(-.5,1)); abline(h=0) Figure 5.1 shows the theoretical ACF of the process. 23

24 ACF lag Figure 5.1: ACF of a seasonal ARIMA process 24

STAT 436 / Lecture 16: Key

STAT 436 / Lecture 16: Key STAT 436 / 536 - Lecture 16: Key Modeling Non-Stationary Time Series Many time series models are non-stationary. Recall a time series is stationary if the mean and variance are constant in time and the

More information

The log transformation produces a time series whose variance can be treated as constant over time.

The log transformation produces a time series whose variance can be treated as constant over time. TAT 520 Homework 6 Fall 2017 Note: Problem 5 is mandatory for graduate students and extra credit for undergraduates. 1) The quarterly earnings per share for 1960-1980 are in the object in the TA package.

More information

Chapter 8: Model Diagnostics

Chapter 8: Model Diagnostics Chapter 8: Model Diagnostics Model diagnostics involve checking how well the model fits. If the model fits poorly, we consider changing the specification of the model. A major tool of model diagnostics

More information

TIME SERIES ANALYSIS AND FORECASTING USING THE STATISTICAL MODEL ARIMA

TIME SERIES ANALYSIS AND FORECASTING USING THE STATISTICAL MODEL ARIMA CHAPTER 6 TIME SERIES ANALYSIS AND FORECASTING USING THE STATISTICAL MODEL ARIMA 6.1. Introduction A time series is a sequence of observations ordered in time. A basic assumption in the time series analysis

More information

STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9)

STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9) STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9) Outline 1 Building ARIMA Models 2 SARIMA 3 Homework 4c Arthur Berg STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9) 2/ 34 Outline 1 Building ARIMA Models

More information

STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9) Outline. Return Rate. US Gross National Product

STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9) Outline. Return Rate. US Gross National Product STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9) Outline 1 Building ARIMA Models 2 SARIMA 3 Homework 4c Arthur Berg STA 6857 ARIMA and SARIMA Models ( 3.8 and 3.9) 2/ 34 Return Rate Suppose x t is the value

More information

Minitab Project Report - Assignment 6

Minitab Project Report - Assignment 6 .. Sunspot data Minitab Project Report - Assignment Time Series Plot of y Time Series Plot of X y X 7 9 7 9 The data have a wavy pattern. However, they do not show any seasonality. There seem to be an

More information

AR(p) + I(d) + MA(q) = ARIMA(p, d, q)

AR(p) + I(d) + MA(q) = ARIMA(p, d, q) AR(p) + I(d) + MA(q) = ARIMA(p, d, q) Outline 1 4.1: Nonstationarity in the Mean 2 ARIMA Arthur Berg AR(p) + I(d)+ MA(q) = ARIMA(p, d, q) 2/ 19 Deterministic Trend Models Polynomial Trend Consider the

More information

Suan Sunandha Rajabhat University

Suan Sunandha Rajabhat University Forecasting Exchange Rate between Thai Baht and the US Dollar Using Time Series Analysis Kunya Bowornchockchai Suan Sunandha Rajabhat University INTRODUCTION The objective of this research is to forecast

More information

Part 1. Multiple Choice (50 questions, 1 point each) Part 2. Problems/Short Answer (10 questions, 5 points each)

Part 1. Multiple Choice (50 questions, 1 point each) Part 2. Problems/Short Answer (10 questions, 5 points each) GROUND RULES: This exam contains two parts: Part 1. Multiple Choice (50 questions, 1 point each) Part 2. Problems/Short Answer (10 questions, 5 points each) The maximum number of points on this exam is

More information

Module 3. Descriptive Time Series Statistics and Introduction to Time Series Models

Module 3. Descriptive Time Series Statistics and Introduction to Time Series Models Module 3 Descriptive Time Series Statistics and Introduction to Time Series Models Class notes for Statistics 451: Applied Time Series Iowa State University Copyright 2015 W Q Meeker November 11, 2015

More information

Marcel Dettling. Applied Time Series Analysis SS 2013 Week 05. ETH Zürich, March 18, Institute for Data Analysis and Process Design

Marcel Dettling. Applied Time Series Analysis SS 2013 Week 05. ETH Zürich, March 18, Institute for Data Analysis and Process Design Marcel Dettling Institute for Data Analysis and Process Design Zurich University of Applied Sciences marcel.dettling@zhaw.ch http://stat.ethz.ch/~dettling ETH Zürich, March 18, 2013 1 Basics of Modeling

More information

Circle the single best answer for each multiple choice question. Your choice should be made clearly.

Circle the single best answer for each multiple choice question. Your choice should be made clearly. TEST #1 STA 4853 March 6, 2017 Name: Please read the following directions. DO NOT TURN THE PAGE UNTIL INSTRUCTED TO DO SO Directions This exam is closed book and closed notes. There are 32 multiple choice

More information

Forecasting using R. Rob J Hyndman. 2.4 Non-seasonal ARIMA models. Forecasting using R 1

Forecasting using R. Rob J Hyndman. 2.4 Non-seasonal ARIMA models. Forecasting using R 1 Forecasting using R Rob J Hyndman 2.4 Non-seasonal ARIMA models Forecasting using R 1 Outline 1 Autoregressive models 2 Moving average models 3 Non-seasonal ARIMA models 4 Partial autocorrelations 5 Estimation

More information

Some Time-Series Models

Some Time-Series Models Some Time-Series Models Outline 1. Stochastic processes and their properties 2. Stationary processes 3. Some properties of the autocorrelation function 4. Some useful models Purely random processes, random

More information

Time Series I Time Domain Methods

Time Series I Time Domain Methods Astrostatistics Summer School Penn State University University Park, PA 16802 May 21, 2007 Overview Filtering and the Likelihood Function Time series is the study of data consisting of a sequence of DEPENDENT

More information

Econometría 2: Análisis de series de Tiempo

Econometría 2: Análisis de series de Tiempo Econometría 2: Análisis de series de Tiempo Karoll GOMEZ kgomezp@unal.edu.co http://karollgomez.wordpress.com Segundo semestre 2016 III. Stationary models 1 Purely random process 2 Random walk (non-stationary)

More information

Circle a single answer for each multiple choice question. Your choice should be made clearly.

Circle a single answer for each multiple choice question. Your choice should be made clearly. TEST #1 STA 4853 March 4, 215 Name: Please read the following directions. DO NOT TURN THE PAGE UNTIL INSTRUCTED TO DO SO Directions This exam is closed book and closed notes. There are 31 questions. Circle

More information

Ch 6. Model Specification. Time Series Analysis

Ch 6. Model Specification. Time Series Analysis We start to build ARIMA(p,d,q) models. The subjects include: 1 how to determine p, d, q for a given series (Chapter 6); 2 how to estimate the parameters (φ s and θ s) of a specific ARIMA(p,d,q) model (Chapter

More information

CHAPTER 8 MODEL DIAGNOSTICS. 8.1 Residual Analysis

CHAPTER 8 MODEL DIAGNOSTICS. 8.1 Residual Analysis CHAPTER 8 MODEL DIAGNOSTICS We have now discussed methods for specifying models and for efficiently estimating the parameters in those models. Model diagnostics, or model criticism, is concerned with testing

More information

Final Examination 7/6/2011

Final Examination 7/6/2011 The Islamic University of Gaza Faculty of Commerce Department of Economics & Applied Statistics Time Series Analysis - Dr. Samir Safi Spring Semester 211 Final Examination 7/6/211 Name: ID: INSTRUCTIONS:

More information

Ch 8. MODEL DIAGNOSTICS. Time Series Analysis

Ch 8. MODEL DIAGNOSTICS. Time Series Analysis Model diagnostics is concerned with testing the goodness of fit of a model and, if the fit is poor, suggesting appropriate modifications. We shall present two complementary approaches: analysis of residuals

More information

Dynamic Time Series Regression: A Panacea for Spurious Correlations

Dynamic Time Series Regression: A Panacea for Spurious Correlations International Journal of Scientific and Research Publications, Volume 6, Issue 10, October 2016 337 Dynamic Time Series Regression: A Panacea for Spurious Correlations Emmanuel Alphonsus Akpan *, Imoh

More information

Firstly, the dataset is cleaned and the years and months are separated to provide better distinction (sample below).

Firstly, the dataset is cleaned and the years and months are separated to provide better distinction (sample below). Project: Forecasting Sales Step 1: Plan Your Analysis Answer the following questions to help you plan out your analysis: 1. Does the dataset meet the criteria of a time series dataset? Make sure to explore

More information

COMPUTER SESSION 3: ESTIMATION AND FORECASTING.

COMPUTER SESSION 3: ESTIMATION AND FORECASTING. UPPSALA UNIVERSITY Department of Mathematics JR Analysis of Time Series 1MS014 Spring 2010 COMPUTER SESSION 3: ESTIMATION AND FORECASTING. 1 Introduction The purpose of this exercise is two-fold: (i) By

More information

Basics: Definitions and Notation. Stationarity. A More Formal Definition

Basics: Definitions and Notation. Stationarity. A More Formal Definition Basics: Definitions and Notation A Univariate is a sequence of measurements of the same variable collected over (usually regular intervals of) time. Usual assumption in many time series techniques is that

More information

Lecture 5: Estimation of time series

Lecture 5: Estimation of time series Lecture 5, page 1 Lecture 5: Estimation of time series Outline of lesson 5 (chapter 4) (Extended version of the book): a.) Model formulation Explorative analyses Model formulation b.) Model estimation

More information

Forecasting using R. Rob J Hyndman. 3.2 Dynamic regression. Forecasting using R 1

Forecasting using R. Rob J Hyndman. 3.2 Dynamic regression. Forecasting using R 1 Forecasting using R Rob J Hyndman 3.2 Dynamic regression Forecasting using R 1 Outline 1 Regression with ARIMA errors 2 Stochastic and deterministic trends 3 Periodic seasonality 4 Lab session 14 5 Dynamic

More information

STAT 520 FORECASTING AND TIME SERIES 2013 FALL Homework 05

STAT 520 FORECASTING AND TIME SERIES 2013 FALL Homework 05 STAT 520 FORECASTING AND TIME SERIES 2013 FALL Homework 05 1. ibm data: The random walk model of first differences is chosen to be the suggest model of ibm data. That is (1 B)Y t = e t where e t is a mean

More information

Univariate linear models

Univariate linear models Univariate linear models The specification process of an univariate ARIMA model is based on the theoretical properties of the different processes and it is also important the observation and interpretation

More information

The Problem. Regression With Correlated Errors. Generalized Least Squares. Correlated Errors. Consider the typical regression model.

The Problem. Regression With Correlated Errors. Generalized Least Squares. Correlated Errors. Consider the typical regression model. The Problem Regression With Correlated Errors Consider the typical regression model y t = β z t + x t where x t is a process with covariance function γ(s, t). The matrix formulation is y = Z β + x where

More information

{ } Stochastic processes. Models for time series. Specification of a process. Specification of a process. , X t3. ,...X tn }

{ } Stochastic processes. Models for time series. Specification of a process. Specification of a process. , X t3. ,...X tn } Stochastic processes Time series are an example of a stochastic or random process Models for time series A stochastic process is 'a statistical phenomenon that evolves in time according to probabilistic

More information

Time Series Analysis of United States of America Crude Oil and Petroleum Products Importations from Saudi Arabia

Time Series Analysis of United States of America Crude Oil and Petroleum Products Importations from Saudi Arabia International Journal of Applied Science and Technology Vol. 5, No. 5; October 2015 Time Series Analysis of United States of America Crude Oil and Petroleum Products Importations from Saudi Arabia Olayan

More information

FORECASTING SUGARCANE PRODUCTION IN INDIA WITH ARIMA MODEL

FORECASTING SUGARCANE PRODUCTION IN INDIA WITH ARIMA MODEL FORECASTING SUGARCANE PRODUCTION IN INDIA WITH ARIMA MODEL B. N. MANDAL Abstract: Yearly sugarcane production data for the period of - to - of India were analyzed by time-series methods. Autocorrelation

More information

Part 1. Multiple Choice (40 questions, 1 point each) Part 2. Problems/Short Answer (10 questions, 6 points each)

Part 1. Multiple Choice (40 questions, 1 point each) Part 2. Problems/Short Answer (10 questions, 6 points each) GROUND RULES: This exam contains two parts: Part 1. Multiple Choice (40 questions, 1 point each) Part 2. Problems/Short Answer (10 questions, 6 points each) The maximum number of points on this exam is

More information

Chapter 6: Model Specification for Time Series

Chapter 6: Model Specification for Time Series Chapter 6: Model Specification for Time Series The ARIMA(p, d, q) class of models as a broad class can describe many real time series. Model specification for ARIMA(p, d, q) models involves 1. Choosing

More information

FIN822 project 2 Project 2 contains part I and part II. (Due on November 10, 2008)

FIN822 project 2 Project 2 contains part I and part II. (Due on November 10, 2008) FIN822 project 2 Project 2 contains part I and part II. (Due on November 10, 2008) Part I Logit Model in Bankruptcy Prediction You do not believe in Altman and you decide to estimate the bankruptcy prediction

More information

INTRODUCTION TO TIME SERIES ANALYSIS. The Simple Moving Average Model

INTRODUCTION TO TIME SERIES ANALYSIS. The Simple Moving Average Model INTRODUCTION TO TIME SERIES ANALYSIS The Simple Moving Average Model The Simple Moving Average Model The simple moving average (MA) model: More formally: where t is mean zero white noise (WN). Three parameters:

More information

Advanced Econometrics

Advanced Econometrics Advanced Econometrics Marco Sunder Nov 04 2010 Marco Sunder Advanced Econometrics 1/ 25 Contents 1 2 3 Marco Sunder Advanced Econometrics 2/ 25 Music Marco Sunder Advanced Econometrics 3/ 25 Music Marco

More information

The data was collected from the website and then converted to a time-series indexed from 1 to 86.

The data was collected from the website  and then converted to a time-series indexed from 1 to 86. Introduction For our group project, we analyzed the S&P 500s futures from 30 November, 2015 till 28 March, 2016. The S&P 500 futures give a reasonable estimate of the changes in the market in the short

More information

at least 50 and preferably 100 observations should be available to build a proper model

at least 50 and preferably 100 observations should be available to build a proper model III Box-Jenkins Methods 1. Pros and Cons of ARIMA Forecasting a) need for data at least 50 and preferably 100 observations should be available to build a proper model used most frequently for hourly or

More information

MODELING INFLATION RATES IN NIGERIA: BOX-JENKINS APPROACH. I. U. Moffat and A. E. David Department of Mathematics & Statistics, University of Uyo, Uyo

MODELING INFLATION RATES IN NIGERIA: BOX-JENKINS APPROACH. I. U. Moffat and A. E. David Department of Mathematics & Statistics, University of Uyo, Uyo Vol.4, No.2, pp.2-27, April 216 MODELING INFLATION RATES IN NIGERIA: BOX-JENKINS APPROACH I. U. Moffat and A. E. David Department of Mathematics & Statistics, University of Uyo, Uyo ABSTRACT: This study

More information

ECONOMETRIA II. CURSO 2009/2010 LAB # 3

ECONOMETRIA II. CURSO 2009/2010 LAB # 3 ECONOMETRIA II. CURSO 2009/2010 LAB # 3 BOX-JENKINS METHODOLOGY The Box Jenkins approach combines the moving average and the autorregresive models. Although both models were already known, the contribution

More information

Galaxy Dataset Analysis

Galaxy Dataset Analysis UNIVERSITY OF UTAH MATH 6010 LINEAR MODELS Galaxy Dataset Analysis Author: Curtis MILLER Instructor: Dr. Lajos HORVÀTH November 15, 2015 UNIVERSITY OF UTAH DEPARTMENT OF MATHEMATICS MATH 6010 Project 5

More information

Multivariate Time Series Analysis and Its Applications [Tsay (2005), chapter 8]

Multivariate Time Series Analysis and Its Applications [Tsay (2005), chapter 8] 1 Multivariate Time Series Analysis and Its Applications [Tsay (2005), chapter 8] Insights: Price movements in one market can spread easily and instantly to another market [economic globalization and internet

More information

Transformations for variance stabilization

Transformations for variance stabilization FORECASTING USING R Transformations for variance stabilization Rob Hyndman Author, forecast Variance stabilization If the data show increasing variation as the level of the series increases, then a transformation

More information

Scenario 5: Internet Usage Solution. θ j

Scenario 5: Internet Usage Solution. θ j Scenario : Internet Usage Solution Some more information would be interesting about the study in order to know if we can generalize possible findings. For example: Does each data point consist of the total

More information

Homework 2. For the homework, be sure to give full explanations where required and to turn in any relevant plots.

Homework 2. For the homework, be sure to give full explanations where required and to turn in any relevant plots. Homework 2 1 Data analysis problems For the homework, be sure to give full explanations where required and to turn in any relevant plots. 1. The file berkeley.dat contains average yearly temperatures for

More information

Homework 4. 1 Data analysis problems

Homework 4. 1 Data analysis problems Homework 4 1 Data analysis problems This week we will be analyzing a number of data sets. We are going to build ARIMA models using the steps outlined in class. It is also a good idea to read section 3.8

More information

Chapter 5: Models for Nonstationary Time Series

Chapter 5: Models for Nonstationary Time Series Chapter 5: Models for Nonstationary Time Series Recall that any time series that is a stationary process has a constant mean function. So a process that has a mean function that varies over time must be

More information

Lab: Box-Jenkins Methodology - US Wholesale Price Indicator

Lab: Box-Jenkins Methodology - US Wholesale Price Indicator Lab: Box-Jenkins Methodology - US Wholesale Price Indicator In this lab we explore the Box-Jenkins methodology by applying it to a time-series data set comprising quarterly observations of the US Wholesale

More information

Stat 565. (S)Arima & Forecasting. Charlotte Wickham. stat565.cwick.co.nz. Feb

Stat 565. (S)Arima & Forecasting. Charlotte Wickham. stat565.cwick.co.nz. Feb Stat 565 (S)Arima & Forecasting Feb 2 2016 Charlotte Wickham stat565.cwick.co.nz Today A note from HW #3 Pick up with ARIMA processes Introduction to forecasting HW #3 The sample autocorrelation coefficients

More information

Analysis of Violent Crime in Los Angeles County

Analysis of Violent Crime in Los Angeles County Analysis of Violent Crime in Los Angeles County Xiaohong Huang UID: 004693375 March 20, 2017 Abstract Violent crime can have a negative impact to the victims and the neighborhoods. It can affect people

More information

FORECASTING USING R. Dynamic regression. Rob Hyndman Author, forecast

FORECASTING USING R. Dynamic regression. Rob Hyndman Author, forecast FORECASTING USING R Dynamic regression Rob Hyndman Author, forecast Dynamic regression Regression model with ARIMA errors y t = β 0 + β 1 x 1,t + + β r x r,t + e t y t modeled as function of r explanatory

More information

University of Oxford. Statistical Methods Autocorrelation. Identification and Estimation

University of Oxford. Statistical Methods Autocorrelation. Identification and Estimation University of Oxford Statistical Methods Autocorrelation Identification and Estimation Dr. Órlaith Burke Michaelmas Term, 2011 Department of Statistics, 1 South Parks Road, Oxford OX1 3TG Contents 1 Model

More information

Seasonal Autoregressive Integrated Moving Average Model for Precipitation Time Series

Seasonal Autoregressive Integrated Moving Average Model for Precipitation Time Series Journal of Mathematics and Statistics 8 (4): 500-505, 2012 ISSN 1549-3644 2012 doi:10.3844/jmssp.2012.500.505 Published Online 8 (4) 2012 (http://www.thescipub.com/jmss.toc) Seasonal Autoregressive Integrated

More information

The ARIMA Procedure: The ARIMA Procedure

The ARIMA Procedure: The ARIMA Procedure Page 1 of 120 Overview: ARIMA Procedure Getting Started: ARIMA Procedure The Three Stages of ARIMA Modeling Identification Stage Estimation and Diagnostic Checking Stage Forecasting Stage Using ARIMA Procedure

More information

FE570 Financial Markets and Trading. Stevens Institute of Technology

FE570 Financial Markets and Trading. Stevens Institute of Technology FE570 Financial Markets and Trading Lecture 5. Linear Time Series Analysis and Its Applications (Ref. Joel Hasbrouck - Empirical Market Microstructure ) Steve Yang Stevens Institute of Technology 9/25/2012

More information

Lecture 19 Box-Jenkins Seasonal Models

Lecture 19 Box-Jenkins Seasonal Models Lecture 19 Box-Jenkins Seasonal Models If the time series is nonstationary with respect to its variance, then we can stabilize the variance of the time series by using a pre-differencing transformation.

More information

Chapter 12: An introduction to Time Series Analysis. Chapter 12: An introduction to Time Series Analysis

Chapter 12: An introduction to Time Series Analysis. Chapter 12: An introduction to Time Series Analysis Chapter 12: An introduction to Time Series Analysis Introduction In this chapter, we will discuss forecasting with single-series (univariate) Box-Jenkins models. The common name of the models is Auto-Regressive

More information

NANYANG TECHNOLOGICAL UNIVERSITY SEMESTER II EXAMINATION MAS451/MTH451 Time Series Analysis TIME ALLOWED: 2 HOURS

NANYANG TECHNOLOGICAL UNIVERSITY SEMESTER II EXAMINATION MAS451/MTH451 Time Series Analysis TIME ALLOWED: 2 HOURS NANYANG TECHNOLOGICAL UNIVERSITY SEMESTER II EXAMINATION 2012-2013 MAS451/MTH451 Time Series Analysis May 2013 TIME ALLOWED: 2 HOURS INSTRUCTIONS TO CANDIDATES 1. This examination paper contains FOUR (4)

More information

Forecasting using R. Rob J Hyndman. 2.5 Seasonal ARIMA models. Forecasting using R 1

Forecasting using R. Rob J Hyndman. 2.5 Seasonal ARIMA models. Forecasting using R 1 Forecasting using R Rob J Hyndman 2.5 Seasonal ARIMA models Forecasting using R 1 Outline 1 Backshift notation reviewed 2 Seasonal ARIMA models 3 ARIMA vs ETS 4 Lab session 12 Forecasting using R Backshift

More information

Analyzing And Predicting The Average Monthly Price of Gold. Like many other precious gemstones and metals, the high volume of sales and

Analyzing And Predicting The Average Monthly Price of Gold. Like many other precious gemstones and metals, the high volume of sales and Analyzing And Predicting The Average Monthly Price of Gold Lucas Van Cleef Professor Madonia Economic Forecasting 7/16/16 Like many other precious gemstones and metals, the high volume of sales and consumption

More information

Economics 618B: Time Series Analysis Department of Economics State University of New York at Binghamton

Economics 618B: Time Series Analysis Department of Economics State University of New York at Binghamton Problem Set #1 1. Generate n =500random numbers from both the uniform 1 (U [0, 1], uniformbetween zero and one) and exponential λ exp ( λx) (set λ =2and let x U [0, 1]) b a distributions. Plot the histograms

More information

Unit root problem, solution of difference equations Simple deterministic model, question of unit root

Unit root problem, solution of difference equations Simple deterministic model, question of unit root Unit root problem, solution of difference equations Simple deterministic model, question of unit root (1 φ 1 L)X t = µ, Solution X t φ 1 X t 1 = µ X t = A + Bz t with unknown z and unknown A (clearly X

More information

Empirical Market Microstructure Analysis (EMMA)

Empirical Market Microstructure Analysis (EMMA) Empirical Market Microstructure Analysis (EMMA) Lecture 3: Statistical Building Blocks and Econometric Basics Prof. Dr. Michael Stein michael.stein@vwl.uni-freiburg.de Albert-Ludwigs-University of Freiburg

More information

Univariate Time Series Analysis; ARIMA Models

Univariate Time Series Analysis; ARIMA Models Econometrics 2 Fall 24 Univariate Time Series Analysis; ARIMA Models Heino Bohn Nielsen of4 Outline of the Lecture () Introduction to univariate time series analysis. (2) Stationarity. (3) Characterizing

More information

Lecture 16: ARIMA / GARCH Models Steven Skiena. skiena

Lecture 16: ARIMA / GARCH Models Steven Skiena.  skiena Lecture 16: ARIMA / GARCH Models Steven Skiena Department of Computer Science State University of New York Stony Brook, NY 11794 4400 http://www.cs.sunysb.edu/ skiena Moving Average Models A time series

More information

Estimating AR/MA models

Estimating AR/MA models September 17, 2009 Goals The likelihood estimation of AR/MA models AR(1) MA(1) Inference Model specification for a given dataset Why MLE? Traditional linear statistics is one methodology of estimating

More information

Using Analysis of Time Series to Forecast numbers of The Patients with Malignant Tumors in Anbar Provinc

Using Analysis of Time Series to Forecast numbers of The Patients with Malignant Tumors in Anbar Provinc Using Analysis of Time Series to Forecast numbers of The Patients with Malignant Tumors in Anbar Provinc /. ) ( ) / (Box & Jenkins).(.(2010-2006) ARIMA(2,1,0). Abstract: The aim of this research is to

More information

Decision 411: Class 9. HW#3 issues

Decision 411: Class 9. HW#3 issues Decision 411: Class 9 Presentation/discussion of HW#3 Introduction to ARIMA models Rules for fitting nonseasonal models Differencing and stationarity Reading the tea leaves : : ACF and PACF plots Unit

More information

Lecture 4a: ARMA Model

Lecture 4a: ARMA Model Lecture 4a: ARMA Model 1 2 Big Picture Most often our goal is to find a statistical model to describe real time series (estimation), and then predict the future (forecasting) One particularly popular model

More information

A stochastic modeling for paddy production in Tamilnadu

A stochastic modeling for paddy production in Tamilnadu 2017; 2(5): 14-21 ISSN: 2456-1452 Maths 2017; 2(5): 14-21 2017 Stats & Maths www.mathsjournal.com Received: 04-07-2017 Accepted: 05-08-2017 M Saranyadevi Assistant Professor (GUEST), Department of Statistics,

More information

Lecture 2: Univariate Time Series

Lecture 2: Univariate Time Series Lecture 2: Univariate Time Series Analysis: Conditional and Unconditional Densities, Stationarity, ARMA Processes Prof. Massimo Guidolin 20192 Financial Econometrics Spring/Winter 2017 Overview Motivation:

More information

Modelling using ARMA processes

Modelling using ARMA processes Modelling using ARMA processes Step 1. ARMA model identification; Step 2. ARMA parameter estimation Step 3. ARMA model selection ; Step 4. ARMA model checking; Step 5. forecasting from ARMA models. 33

More information

2. An Introduction to Moving Average Models and ARMA Models

2. An Introduction to Moving Average Models and ARMA Models . An Introduction to Moving Average Models and ARMA Models.1 White Noise. The MA(1) model.3 The MA(q) model..4 Estimation and forecasting of MA models..5 ARMA(p,q) models. The Moving Average (MA) models

More information

Stat 5100 Handout #12.e Notes: ARIMA Models (Unit 7) Key here: after stationary, identify dependence structure (and use for forecasting)

Stat 5100 Handout #12.e Notes: ARIMA Models (Unit 7) Key here: after stationary, identify dependence structure (and use for forecasting) Stat 5100 Handout #12.e Notes: ARIMA Models (Unit 7) Key here: after stationary, identify dependence structure (and use for forecasting) (overshort example) White noise H 0 : Let Z t be the stationary

More information

10. Time series regression and forecasting

10. Time series regression and forecasting 10. Time series regression and forecasting Key feature of this section: Analysis of data on a single entity observed at multiple points in time (time series data) Typical research questions: What is the

More information

Modeling and forecasting global mean temperature time series

Modeling and forecasting global mean temperature time series Modeling and forecasting global mean temperature time series April 22, 2018 Abstract: An ARIMA time series model was developed to analyze the yearly records of the change in global annual mean surface

More information

Univariate ARIMA Models

Univariate ARIMA Models Univariate ARIMA Models ARIMA Model Building Steps: Identification: Using graphs, statistics, ACFs and PACFs, transformations, etc. to achieve stationary and tentatively identify patterns and model components.

More information

Forecasting. Simon Shaw 2005/06 Semester II

Forecasting. Simon Shaw 2005/06 Semester II Forecasting Simon Shaw s.c.shaw@maths.bath.ac.uk 2005/06 Semester II 1 Introduction A critical aspect of managing any business is planning for the future. events is called forecasting. Predicting future

More information

Time Series Analysis -- An Introduction -- AMS 586

Time Series Analysis -- An Introduction -- AMS 586 Time Series Analysis -- An Introduction -- AMS 586 1 Objectives of time series analysis Data description Data interpretation Modeling Control Prediction & Forecasting 2 Time-Series Data Numerical data

More information

Chapter 3: Regression Methods for Trends

Chapter 3: Regression Methods for Trends Chapter 3: Regression Methods for Trends Time series exhibiting trends over time have a mean function that is some simple function (not necessarily constant) of time. The example random walk graph from

More information

EASTERN MEDITERRANEAN UNIVERSITY ECON 604, FALL 2007 DEPARTMENT OF ECONOMICS MEHMET BALCILAR ARIMA MODELS: IDENTIFICATION

EASTERN MEDITERRANEAN UNIVERSITY ECON 604, FALL 2007 DEPARTMENT OF ECONOMICS MEHMET BALCILAR ARIMA MODELS: IDENTIFICATION ARIMA MODELS: IDENTIFICATION A. Autocorrelations and Partial Autocorrelations 1. Summary of What We Know So Far: a) Series y t is to be modeled by Box-Jenkins methods. The first step was to convert y t

More information

TIME SERIES ANALYSIS. Forecasting and Control. Wiley. Fifth Edition GWILYM M. JENKINS GEORGE E. P. BOX GREGORY C. REINSEL GRETA M.

TIME SERIES ANALYSIS. Forecasting and Control. Wiley. Fifth Edition GWILYM M. JENKINS GEORGE E. P. BOX GREGORY C. REINSEL GRETA M. TIME SERIES ANALYSIS Forecasting and Control Fifth Edition GEORGE E. P. BOX GWILYM M. JENKINS GREGORY C. REINSEL GRETA M. LJUNG Wiley CONTENTS PREFACE TO THE FIFTH EDITION PREFACE TO THE FOURTH EDITION

More information

Ch3. TRENDS. Time Series Analysis

Ch3. TRENDS. Time Series Analysis 3.1 Deterministic Versus Stochastic Trends The simulated random walk in Exhibit 2.1 shows a upward trend. However, it is caused by a strong correlation between the series at nearby time points. The true

More information

Reliability and Risk Analysis. Time Series, Types of Trend Functions and Estimates of Trends

Reliability and Risk Analysis. Time Series, Types of Trend Functions and Estimates of Trends Reliability and Risk Analysis Stochastic process The sequence of random variables {Y t, t = 0, ±1, ±2 } is called the stochastic process The mean function of a stochastic process {Y t} is the function

More information

ARIMA Modelling and Forecasting

ARIMA Modelling and Forecasting ARIMA Modelling and Forecasting Economic time series often appear nonstationary, because of trends, seasonal patterns, cycles, etc. However, the differences may appear stationary. Δx t x t x t 1 (first

More information

Statistical Methods for Forecasting

Statistical Methods for Forecasting Statistical Methods for Forecasting BOVAS ABRAHAM University of Waterloo JOHANNES LEDOLTER University of Iowa John Wiley & Sons New York Chichester Brisbane Toronto Singapore Contents 1 INTRODUCTION AND

More information

Estimation and application of best ARIMA model for forecasting the uranium price.

Estimation and application of best ARIMA model for forecasting the uranium price. Estimation and application of best ARIMA model for forecasting the uranium price. Medeu Amangeldi May 13, 2018 Capstone Project Superviser: Dongming Wei Second reader: Zhenisbek Assylbekov Abstract This

More information

Romanian Economic and Business Review Vol. 3, No. 3 THE EVOLUTION OF SNP PETROM STOCK LIST - STUDY THROUGH AUTOREGRESSIVE MODELS

Romanian Economic and Business Review Vol. 3, No. 3 THE EVOLUTION OF SNP PETROM STOCK LIST - STUDY THROUGH AUTOREGRESSIVE MODELS THE EVOLUTION OF SNP PETROM STOCK LIST - STUDY THROUGH AUTOREGRESSIVE MODELS Marian Zaharia, Ioana Zaheu, and Elena Roxana Stan Abstract Stock exchange market is one of the most dynamic and unpredictable

More information

Econometrics II Heij et al. Chapter 7.1

Econometrics II Heij et al. Chapter 7.1 Chapter 7.1 p. 1/2 Econometrics II Heij et al. Chapter 7.1 Linear Time Series Models for Stationary data Marius Ooms Tinbergen Institute Amsterdam Chapter 7.1 p. 2/2 Program Introduction Modelling philosophy

More information

MAT3379 (Winter 2016)

MAT3379 (Winter 2016) MAT3379 (Winter 2016) Assignment 4 - SOLUTIONS The following questions will be marked: 1a), 2, 4, 6, 7a Total number of points for Assignment 4: 20 Q1. (Theoretical Question, 2 points). Yule-Walker estimation

More information

ITSM-R Reference Manual

ITSM-R Reference Manual ITSM-R Reference Manual George Weigt February 11, 2018 1 Contents 1 Introduction 3 1.1 Time series analysis in a nutshell............................... 3 1.2 White Noise Variance.....................................

More information

Lecture Notes of Bus (Spring 2017) Analysis of Financial Time Series Ruey S. Tsay

Lecture Notes of Bus (Spring 2017) Analysis of Financial Time Series Ruey S. Tsay Lecture Notes of Bus 41202 (Spring 2017) Analysis of Financial Time Series Ruey S. Tsay Simple AR models: (Regression with lagged variables.) Motivating example: The growth rate of U.S. quarterly real

More information

Time Series Modeling. Shouvik Mani April 5, /688: Practical Data Science Carnegie Mellon University

Time Series Modeling. Shouvik Mani April 5, /688: Practical Data Science Carnegie Mellon University Time Series Modeling Shouvik Mani April 5, 2018 15-388/688: Practical Data Science Carnegie Mellon University Goals After this lecture, you will be able to: Explain key properties of time series data Describe,

More information

Statistics Homework #4

Statistics Homework #4 Statistics 910 1 Homework #4 Chapter 6, Shumway and Stoffer These are outlines of the solutions. If you would like to fill in other details, please come see me during office hours. 6.1 State-space representation

More information

ibm: daily closing IBM stock prices (dates not given) internet: number of users logged on to an Internet server each minute (dates/times not given)

ibm: daily closing IBM stock prices (dates not given) internet: number of users logged on to an Internet server each minute (dates/times not given) Remark: Problem 1 is the most important problem on this assignment (it will prepare you for your project). Problem 2 was taken largely from last year s final exam. Problem 3 consists of a bunch of rambling

More information

A time series is called strictly stationary if the joint distribution of every collection (Y t

A time series is called strictly stationary if the joint distribution of every collection (Y t 5 Time series A time series is a set of observations recorded over time. You can think for example at the GDP of a country over the years (or quarters) or the hourly measurements of temperature over a

More information

Forecasting Bangladesh's Inflation through Econometric Models

Forecasting Bangladesh's Inflation through Econometric Models American Journal of Economics and Business Administration Original Research Paper Forecasting Bangladesh's Inflation through Econometric Models 1,2 Nazmul Islam 1 Department of Humanities, Bangladesh University

More information