Quantcast
Channel: Bogumił Kamiński – R-bloggers
Viewing all articles
Browse latest Browse all 49

Cont model back after a year

$
0
0

(This article was first published on R snippets, and kindly contributed to R-bloggers)
During ESSA2013 conference I had a discussion about Cont model I have commented a year ago.
In original paper Cont highlights that his model produces distribution of returns characterized by positive excess kurtosis. In this post I want to investigate this assertion.
Cont simulation has three key parameters (check out the paper for details):

  • d: standard deviation of new public information incoming to the investors
  • l: market depth (this implies that maximum percentage price change is in range [-1/l,1/l])
  • s: percentage of investors updating their decision threshold

We want to simulate the model with 1000 agents for 11000 periods (dropping first 1000 as warm up) and calculate kurtosis of observed returns distribution. The selected ranges of d, l and s parameters follow Cont recommendations. Here is the code that generates the data:

library(e1071)
library(mgcv)

cont.run <- function(burn.in, reps, n, d, l ,s) {
  tr <- rep(0, n)
  sig <- rnorm(reps, 0, d)
  r <- rep(0, reps)
  for (i in 1:reps) {
    r[i] <- (sum(sig[i] > tr) - sum(sig[i] < (-tr))) / (l * n)
    tr[runif(n) < s] <- abs(r[i])
  }
  return(r[burn.in:reps])
}

sim.points <- 60000
d <- runif(sim.points,0.001,0.01)
l <- runif(sim.points,5,20)
s <- runif(sim.points,0.01,0.1)
k <- mapply(function(d, l, s) {
              kurtosis(cont.run(1000, 10000, 1000, d, l ,s))
            }, d, l, s)

Warning! The simulation takes a lot of time so I have uploaded here the file sim_output.txt containing the results. It contains four columns: dlsk, where last column holds calculated kurtosis.

Now let us turn to the code that allows us to visually explore the data. I have saved the generated plots to GIF file using animation package. They show the probability of encountering excess kurtosis in generated data conditional on dl and s.

library(ggplot2)

data.set <- read.table("sim_output.txt", head = T,
                       colClasses = rep("numeric", 4))
data.set$cd <- cut(data.set$d, seq(0.001, 0.01, len = 10))
data.set$cl <- cut(data.set$l, seq(5, 20, len = 16))
data.set$cs <- cut(data.set$s, seq(0.01, 0.1, len = 10))
data.set$p.excess <- as.numeric(data.set$k > 0)
sum.data <- aggregate(p.excess ~ cd + cl + cs, data = data.set, mean)

for (i in levels(sum.data$cs)[c(1:9, 8:2)]) {
    print(ggplot() +
        geom_point(data = sum.data[sum.data$cs == i,],
            aes(x = cl, y = cd, colour = p.excess),
            shape = 15, size = 10) +
      scale_colour_gradient(low = "blue", high = "red") +
      theme(panel.background =element_blank(),
          axis.title.x = element_blank(),
          axis.title.y = element_blank(),
          text=element_text(colour = "black", size = 14),
          axis.text.x=element_text(angle = -90)) +
      ggtitle(paste("cs:", i)))
}

And here is the result (d is on y-axis and l on x-axis):

We can see that s is the least important parameter and there is a non linear interaction between d and l. But most importantly - in the given range parameters excess kurtosis is not guaranteed to appear. In particular it does not happen when both d and l are large.

To leave a comment for the author, please follow the link and comment on his blog: R snippets.

R-bloggers.com offers daily e-mail updates about R news and tutorials on topics such as: visualization (ggplot2, Boxplots, maps, animation), programming (RStudio, Sweave, LaTeX, SQL, Eclipse, git, hadoop, Web Scraping) statistics (regression, PCA, time series, trading) and more...

Viewing all articles
Browse latest Browse all 49

Trending Articles