First Baruch Volatility Workshop

Size: px
Start display at page:

Download "First Baruch Volatility Workshop"

Transcription

1 irst Baruch Volatility Workshop Session 5: Variance swaps, gamma swaps, VIX, and VVIX Instructor: Jim Gatheral Outline of Session 5 Spanning generalized European payoffs he log contract Variances swaps and gamma swaps he VIX index VIX futures and options VVIX Joint modeling of SPX and VIX Volatility derivatives In this session, we will investigate the pricing and hedging of claims that have realized volatility or variance (quadratic variation) as underlying. We might expect volatility derivatives be very exotic and therefore hard to price and hedge It turns out that in some respects, they are amongst the safest and easiest. In our survey of volatility derivatives, we will encounter some of the most elegant constructions in financial mathematics. Spanning generalized European payoffs As usual, we assume that European options with all possible strikes and expirations are traded. We will show that any twice-differentiable payoff at time portfolio of European options expiring at time. may be statically hedged using a

2 Proof from [Carr and Madan] he value of a claim with a generalized payoff g( S ) at time is given by g( S ) = g(k) δ( S K) dk = S Integrating by parts gives [2] g(k) δ( K) dk + g(k) δ( K) dk g( S ) = g() g (K) θ(k ) dk + (K) θ( K) dk S S g S... and integrating by parts again gives (1) g( S ) = = g (K) (K S ) + dk + g (K) ( K dk S ) + + g() g () [( S ) + ( S ) + ] g (K) (K S ) + dk + g (K) ( K dk S ) + + g() + () ( ) g S hen, with = E[ S ], (2) E [g( S )] = g() + dk P (K) g (K) + dk (K) (K) C g is twice- Equation (1) shows how to build any curve using hockey-stick payoffs (if differentiable). g( )

3 Remarks on spanning of European-style payoffs rom equation (1) we see that any European-style twice-differentiable payoff may be replicated using a portfolio of European options with strikes from to. he weight of each option equal to the second derivative of the payoff at the strike price of the option. his portfolio of European options is a static hedge because the weight of an option with a particular strike depends only on the strike price and the form of the payoff function and not on time or the level of the stock price. Note further that equation (1) is completely model-independent (except that there should be no jumps). Example: European options In fact, using Dirac delta-functions, we can extend the above result to payoffs which are not twicedifferentiable. or example with g( S ) = ( S L) +, g (K) = δ(k L) and equation (2) gives: E [( S L ) + ] = with the last step following from put-call parity as before. he replicating portfolio for a European option is just the option itself. = ( L ) + + dk P (K) δ(k L) + dk C (K) δ(k L) ( L) + P (L) = { C (L) = C (L) L < L

4 he log contract Now consider a contract whose payoff at time is log( S /). hen (K) = and it follows from equation (2) that S E [ log ( )] Rewriting this equation in terms of the log-strike variable expression g 1/S 2 =K dk = (K) (K) P dk K 2 C K 2 k := log (K/) S, we get the promising-looking (3) S E [ log ( )] = dk p(k) dk c(k) with C ( e c(y) := y ) P ( e ) ; p(y) := y e y e y representing option prices expressed in terms of percentage of the strike price. Variance swaps Assume zero interest rates and dividends. hen = S and applying Itô s Lemma, path-by-path (4) S log ( ) S = log ds ( S ) = d log ( S ) t = t σ 2 t dt 2 S t he second term on the RHS of equation (4) is immediately recognizable as half the total variance (or quadratic variation) over the interval. W := x [, ] he first term on the RHS represents the payoff of a hedging strategy which involves maintaining a constant dollar amount in stock (if the stock price increases, sell stock; if the stock price decreases, buy stock so as to maintain a constant dollar value of stock). Since the log payoff on the LHS can be hedged using a portfolio of European options as noted earlier, it follows that the total variance W may be replicated in a completely model-independent way so long as the stock price process is a diffusion. In particular, volatility may be stochastic or deterministic and equation (4) still applies.

5 he log-strip hedge for a variance swap Now taking the risk-neutral expectation of (4) and comparing with equation (3), we obtain (5) E σ dt = 2 E [ t 2 ] [ log ( )] = 2 dk p(k) + dk c(k) { } S S We see that the fair value of total variance is given by the value of an infinite strip of European options in a completely model-independent way so long as the underlying process is a diffusion. Setup R environment In [1]: %load_ext rpy2.ipython

6 In [2]: download.file(url=" ", destfile="vw5.zip") unzip(zipfile="vw5.zip") library(quantmod) source("blackscholes.r") source("heston2.r") source("plotivols.r") source("svi.r") source("svivarswap.r") # Read in SPX and VIX options data from 15-Sep-211 load("spxvix rdata") load("fitqr11915.rdata") trying URL ' Content type 'application/zip' length 9754 bytes (94 KB) opened URL ================================================== downloaded 94 KB Loading required package: xts Loading required package: zoo Attaching package: zoo he following objects are masked from package:base : as.date, as.date.numeric Loading required package: R Version.4- included new data defaults. See?getSymbols. R-code to implement the variance swap log-strip

7 In [3]: svivarswap <- function(svimatrix,texp){ nslices <- length(texp) varres <- numeric(nslices) for (slice in 1:nSlices){ t <- texp[slice] volbs <- function(k){sqrt(svi(svimatrix[slice,],k)/t)} cilde <- function(y){bsormula(1, 1/y, t, r=, volbs(-log(y)))} pilde <- function(y){bsormulaput(1, y, t, r=, volbs(log(y)))/y^2} callintegral <- integrate(cilde,lower=,upper=1)$value putintegral <- integrate(pilde,lower=,upper=1)$value varres[slice] <- 2*(callIntegral+putIntegral)/t # Equation (11.4) of VS } return(varres) # Returns vector of variance swaps in variance (vol. squared) terms } SPX volatility smiles as of 15-Sep-211 In [4]: res <- plotivols(spxoptdata,svimatrix=fitqr ) texp <- res$expiries

8 igure 1: Implied volatility smiles of SPX options as of 15-Sep-211. SVI fits are in orange. Variance swap curve (from log-strip) as of 15-Sep-211 In [5]: svivarswap(svimatrix=fitqr,texp=texp) [1] [7] [13] Comparison of log-strip with market variance swap quotes

9 In [6]: svivs <- sqrt(svivarswap(fitqr,texp=res$expiries)) plot(texp,svivs,ylab="variance swap level", xlab="expiry",type="p",pch=2,cex=2, col="dark green") points(mktvarswapdata$texp,mktvarswapdata$vsbid,col="blue",type="b",lty=2, pch=2,cex=1) points(mktvarswapdata$texp,mktvarswapdata$vsask,col="red",type="b",lty=2,pch=2, cex=1) igure 2: Green dots are computed using the log-strip of SPX options. Blue and red points are bid and ask variance swap quotes from a friendly investment bank.

10 Weighted variance swaps Consider the weighted variance swap with payoff α( ) dt. S t v t An application of Itô s Lemma to x α(z) A(x) = 2 dy dz. 1 1 y z 2 gives the quasi-static hedge: (6) α( S t ) v t dt = A( S ) A( S ) A ( ) d S u S u he LHS of (6) is the payoff to be hedged. he last term on the RHS of (6) corresponds to rebalancing in the underlying. he first term on the RHS corresponds to a static position in options given by the spanning formula (1). Example: Gamma swaps he payoff of a gamma swap is 1 S S t v t dt. hus α(x) = x and 2 z 2 A(x) = dy dz = {1 x + x log x}. z 2 S x 1 1 y S 2 he static options hedge is the spanning strip for. S log S S Gamma swaps are marketed as less dangerous because higher variances are associated with lower stock prices.

11 Variance swaps and gamma swaps as traded assets Denote the time t value of the option strip for a variance swap maturing at by t (). hat is S () = 2 E [ log ] = E t v du S [ ]. t u t t Similarly, for a gamma swap t () = 2 E [ S S t log S S t ] = E [ t S u v u du S ]. t t Both t () and t () are random variables representing the prices of traded assets. Specifically, values of portfolios of options appropriately weighted by strike. t () is given by the expectation E t [log S ] of the log contract. t () is given by the expectation E t [ S log S ] of the entropy contract. R-code to implement the gamma swap log-strip In [7]: svigammaswap <- function(svimatrix,texp){ nslices <- length(texp) varres <- numeric(nslices) for (slice in 1:nSlices){ t <- texp[slice] volbs <- function(k){sqrt(svi(svimatrix[slice,],k)/t)} cilde <- function(y){bsormula(1, 1/y, t, r=, volbs(-log(y)))/y} pilde <- function(y){bsormulaput(1, y, t, r=, volbs(log(y)))/y} possibleerror <- trycatch(callintegral <- integrate(cilde,lower=,upper=1)$ value,error=function(e) e) possibleerror <- trycatch(putintegral <- integrate(pilde,lower=,upper=1)$v alue,error=function(e) e) if(!inherits(possibleerror,"error")){ varres[slice] <- 2*(callIntegral+putIntegral)/t } else {varres[slice] <- NA} } return(varres) # Returns vector of variance swaps in variance (vol. squared) terms } Comparison of variance swap and gamma swap curves

12 In [8]: svivs <- sqrt(svivarswap(fitqr,texp=res$expiries)) svigs <- sqrt(svigammaswap(fitqr,texp=res$expiries)) plot(texp,svivs,ylab="variance swap level", xlab="expiry",type="p",pch=2,cex=2, col="red",ylim=c(.25,.36)) points(texp,svigs,type="p",pch=2,cex=2,col="dark green") igure 3: Red dots are computed using the log-strip of SPX options (variance swaps). Dark green dots are from the entropy strip of SPX options (gamma swaps). Note that with negative correlation between underlying and volatility moves (or alternatively with negative skew), the gamma swap has to be lower than the variance swap.

13 he leverage swap ollowing [ukasawa] swap: [4], consider the expected quadratic covariation of the underlying and the variance E [ S, () ] := E ds d (). [ t t ] Itô s Lemma gives so d( S t t ()) = S t d t () + t () d S t + ds t d t () E [ S, () ] = E[ S ()] S () E S d (). [ t t ] Noting that () = and that d t () = v t dt, we obtain (7) where E [ S, () ] = E S dt () [ t v t S ] = S ( () ()) = S () () = () () is the leverage swap. hus the leverage swap gives us the expected quadratic covariation between the underlying and the variance swap. his result is completely model independent (assuming diffusion), just as in the variance swap and gamma swap cases. Expression in terms of log and entropy contracts Going back to the expression of the variance and gamma swaps in terms of log and entropy contracts respectively, S t() = t () () = 2 E t [( + 1 ) log S t S S t ]. Leverage swap term structure

14 In [9]: svivs2 <- svivarswap(fitqr,texp=res$expiries) svigs2 <- svigammaswap(fitqr,texp=res$expiries) svilevswap <- (svigs2 - svivs2)/svivs2 # We normalized here plot(texp,svilevswap,ylab="variance swap level", xlab="expiry",type="p",pch=2,c ex=2,col="red") igure 4: Red dots are normalized leverage swaps as of 15-Sep-211 computed using the log and entropy SPX option strips.

15 Variance swap contracts in practice A variance swap is not really a swap at all but a forward contract on the realized annualized variance. he payoff at time is N A { N 1 N i=1 S i { log ( )} S i { log S N N ( )} S 2 } N K var N A K var where is the notional amount of the swap, is the annualization factor and is the strike price. Annualized variance may or may not be defined as mean-adjusted in practice. rom a theoretical perspective, the beauty of a variance swap is that it may be replicated perfectly assuming a diffusion process for the stock price as shown in the previous section. rom a practical perspective, traders may express views on volatility using variance swaps without having to delta hedge. History of variance swaps Variance swaps took off as a product in the aftermath of the LCM meltdown in late 1998 when implied stock index volatility levels rose to unprecedented levels. Hedge funds took advantage of this by paying variance in swaps (selling the realized volatility at high implied levels). he key to their willingness to pay on a variance swap rather than sell options was that a variance swap is a pure play on realized volatility no labor-intensive delta hedging or other path dependency is involved. Dealers were happy to buy vega at these high levels because they were structurally short vega (in the aggregate) through sales of guaranteed equity-linked investments to retail investors and were getting badly hurt by high implied volatility levels.

16 Variance swaps in the Heston model Recall that instantaneous variance follows the process: d v t = λ( v t v ) dt + η v t d Z t hen τ = t where. t () = = = E [ t t 1 e λ τ λ v u du t ] λ (u t) { v + ( v t v ) e } du ( v t v ) + v τ 1 e λ τ ( v t v ) + v Expected annualized variance is then given by. λ τ Model-independence of variance swap Expected variance in the Heston model depends only on, and. It does not depend on the volatility of volatility η. Since the value of a variance swap depends only on the prices of European options, it cannot depend on the specific dynamics assumed (local or stochastic volatility for example). v v λ Dependence of variance swap on skew and curvature In practice, we start with a strip of European options of a given expiration and we would like to know how we should expect the price of a variance swap to relate to the at-the-money-forward implied volatility, the volatility skew and the volatility curvature (smile).

17 A cool formula for the variance swap Define Intuitively, z k z(k) = d 2 = σ BS (k) (k) 2 measures the log-moneyness of an option in implied standard deviations. hen, σ BS (8) E[ W ] = 2 E [ log S ] = dz (z) (z, ) N σ 2 BS o see this formula is plausible, it is obviously correct in the flat-volatility Black-Scholes case. A proof is given in [he Volatility Surface] [6] A generalization due to ukusawa [4] [ukasawa] derives an expression for the value of a generalized European payoff in terms of implied volatilities. As one application, he derives an expression for the value of a gamma swap. Define k σ z(k) = d 1 = + BS (k) σ BS (k) 2 d 1 d 2 (note instead of before). hen, (9) S 2 E [ log S ] = dz (z) (z) N σ 2 BS In particular, if we have a parameterization of the volatility smile (such as SVI), computing the fair value of the leverage swap is straightforward.

18 Dependence on skew and curvature again Now consider the following simple parameterization of the BS implied variance skew: σbs 2 (z) = σ 2 + α z + β z 2 Substituting into equation (8) and integrating, we obtain E[ W ] = σ 2 + β Skew makes no contribution to this expression, only the curvature contributes. he intuition for this is simply that increasing the skew does not change the average level of volatility but increasing the curvature β increases the prices of puts and calls in equation (3) and always increases the fair value of variance. he effect of jumps It can be shown that the error introduced by valuing a variance swap using the log-strip of equation (5) is of the order of the jump-size cubed. hus, in practice, if the log price change between resets is less than or so (as it is for stock indices), the effect of jumps is negligible. If there are no jumps of course, the log-strip values the variance swap correctly. 5% he VIX index ( ( In 24, the CBOE listed futures on the VIX - an implied volatility index. Originally, the VIX computation was designed to mimic the implied volatility of an at-the-money 1 month option on the OEX index. It did this by averaging volatilities from 8 options (puts and calls from the closest to AM strikes in the nearest and next to nearest months). he CBOE changed the VIX computation: CBOE is changing VIX to provide a more precise and robust measure of expected market volatility and to create a viable underlying index for tradable volatility products.

19 he new VIX formula Here is the later VIX definition (converted to our notation) as specified in the CBOE white paper: (1) VI X 2 2 ΔK = i 1 Q ( ) i Ki 2 i K i [ K 1 ] 2 Q i K i K where is the price of the out-of-the-money option with strike and is the highest strike below the forward price. We recognize (1) as a straightforward discretization of the log-strip and makes clear the reason why the CBOE implies that the new index permits replication of volatility. Specifically, (with obvious notation) VI X 2 2 = = =: = One possible discretization of this last expression is K dk K 2 dk K 2 dk K 2 i K 2 K i as in the VIX specification (3). ull details of the CBOE VIX computation are given in ( dk P(K) + C(K) K 2 dk dk P(K) + C(K) + (P(K) C(K)) K K 2 dk Q(K) + (K ) K K 2 K dk 1 Q(K) + dk (K ) K 2 K 2 K dk 1 ( ) Q(K). K 2 2 K 2 K 2 VI X 2 2 ΔK = i 1 Q i ( K i ) [ K 2 1 ] 2

20 VIX as of 15-Sep-211 o proxy the VIX index, we interpolate the log-strips of SPX options. he near and far SPX option strips are computed and disseminated by the CBOE with tickers VIN and VI respectively. Here is a screenshot from Bloomberg: he near and far slices are the third and fourth expirations as of 15-Sep-215: In [1]: print(texp[3:4]*365.25) sqrt(svivs2[3:4]) [1] [1] Computations are very close!

21 VIX futures and options A time- VIX future is valued at time as Δ Δ 1/12 where is around one month (or ). t +Δ E E v ds [{ [ s ]} t ] K VIX t +Δ + E E v ds. ( [ s K ] VIX ) t A VIX option expiring at time with strike is valued at time as Remarks on VIX futures and options Initially, the options were much more liquid and actively traded than the futures. Now however, volume in both futures and options is huge. Both futures and synthetic futures (from put-call parity) used to trade at a substantial premium to the forward-starting variance swap. his arbitrage has come and gone over time. Apparently, since the second quarter of 213, there has been more vega traded in VIX than on SPX, which is now only the second biggest global market for volatility. VIX futures and options Note that we can span the payoff of a forward starting variance swap E t options. [ +Δ v s ds ] using VIX Recall the spanning formula: In this case, E [g( S )] = g() + dk P (K) g (K) + dk (K) (K). C g g(x) = x 2 E t [ so +Δ v s ds = (K) dk + 2 (K) dk. ] VIX P C VIX can be computed using put-call parity or observed directly as the VIX futures price. We need to interpolate and extrapolate out-of-the-money option prices to get the convexity adjustment. VIX VIX

22 orward variance swaps from SPX and VIX options Once again, we can compute the fair value of forward starting variance swaps in three ways: Using variance swaps from the SPX log-strip We just computed these variance swaps. rom the linear strip of VIX options. By interpolating market variance swap quotes. We now compute the linear VIX strip and compare the three computations as of September 15, 211. he VIX volatility smile as of 15-Sep-211 In [11]: res <- plotivols(vixoptdata)

23 igure 5: Implied volatility smiles of VIX options as of 15-Sep-211. Note that all smiles are upward sloping. Interpolation and extrapolation of VIX smiles We can t use SVI because VIX smiles are often concave. We choose the simplest possible interpolation/ extrapolation. Monotonic spline interpolation of mid-vols. Extrapolation at constant level. igure 6: he VIX one month smile with monotonic spline interpolation/ extrapolation. irst we code a function to return VIX implied volatilities with the above interpolation/ extrapolation scheme.

24 In [12]: # Idea is for each slice, comopute midvols, use stinterp to interpolate and then extrapolate at constant above and below. library(stinepack) vixvol <- function(ivoldata, slice){ bidvols <- as.numeric(ivoldata$bid); askvols <- as.numeric(ivoldata$ask); expdates <- unique(ivoldata$exp); ############################################################################## ################################# # Interpolate and extrapolate vols for this slice at requested output points t <- expdates[slice] texp <- ivoldata$exp bidvol <- bidvols[texp==t] askvol <- askvols[texp==t] midvol <- (bidvol+askvol)/2 f <- (ivoldata$wd[texp==t])[1] k <- log(ivoldata$strike[texp==t]/f) # Plot vs log-strike include <-!is.na(bidvol) kmin <- min(k[include]) kmax <- max(k[include]) } # Compute and store interpolated and extrapolated vols kin <- k[!is.na(midvol)] volin <- midvol[!is.na(midvol)] volinterp <- function(kout){ if (kout < kmin){res <- midvol[which(k==kmin)] } else if( kout > kmax){res <- midvol[which(k==kmax)] } else res <- stinterp(x=kin,y=volin, kout)$y return(res) } return(function(x){sapply(x,volinterp)}) Now compute forward-starting variance swaps from the linear strip of VIX options:

25 In [13]: vix2 <- function(ivoldata, slice){ bidvols <- as.numeric(ivoldata$bid) askvols <- as.numeric(ivoldata$ask) expdates <- unique(ivoldata$exp) ############################################################################## ################################# # Interpolate and extrapolate vols for this slice at requested output points t <- expdates[slice] texp <- ivoldata$exp bidvol <- bidvols[texp==t] askvol <- askvols[texp==t] midvol <- (bidvol+askvol)/2 f <- (ivoldata$wd[texp==t])[1] k <- log(ivoldata$strike[texp==t]/f) # Plot vs log-strike include <-!is.na(bidvol) kmin <- min(k[include]) kmax <- max(k[include]) t } # Compute and store interpolated and extrapolated vols kin <- k[!is.na(midvol)] volin <- midvol[!is.na(midvol)] volinterp <- function(kout){ if (kout < kmin){res <- midvol[which(k==kmin)] } else if( kout > kmax){res <- midvol[which(k==kmax)] } else res <- stinterp(x=kin,y=volin, kout)$y return(res) } vixvol <- function(x){sapply(x,volinterp)} # Now we use the vectorized function vixvol to compute the convexity adjustemn cilde <- function(y){exp(y)*bsormula(1, exp(y), t, r=, vixvol(y))} pilde <- function(y){exp(y)*bsormulaput(1, exp(y), t, r=, vixvol(y))} callintegral <- integrate(cilde,lower=,upper=1)$value putintegral <- integrate(pilde,lower=-1,upper=)$value res <- f^2*(1+2*(callintegral+putintegral)) return(res) In [14]: print(vix2n <- sapply(1:6,function(x){sqrt(vix2(vixoptdata,x))})/1) [1]

26 Compute forward variance swaps from market variance swap quotes. In [15]: mv <- mktvarswapdata # Now compute forward-starting variance swaps from var swaps vsmid <- (mv$vsbid+mv$vsask)/2 tvs <- mv$texp vs <- function(tout){stinterp(tvs,vsmid,tout)$y} # VIX dates vixdates <- sort(unique(vixoptdata$exp)) # We need varswaps to vixdates and varswaps to vixdates + 1/12 year wi <- vs(vixdates)^2*vixdates wf <- vs(vixdates+1/12)^2*(vixdates+1/12) vfs <- (wf-wi)*12 sqrt(vfs) [1] NA NA inally, compute forward-starting variance swaps from the log-strip of SPX options In [16]: spxdates <- unique(spxoptdata$exp) vsstrip <- function(tout){stinterp(spxdates,svivs,tout)$y} wis <- vsstrip(vixdates)^2*vixdates wfs <- vsstrip(vixdates+1/12)^2*(vixdates+1/12) vfstrip <- (wfs-wis)*12 sqrt(vfstrip) [1] orward variance swaps as of 15-Sep-211

27 In [17]: plot(vixdates,sqrt(vfs),ylim=c(.3,.4),xlab="vix option expiry", ylab="orward va riance swap",type="p",col="dark green",pch=2, cex=2) points(vixdates, vix2n,col="blue",pch=2,cex=2) points(vixdates, sqrt(vfstrip),col="red",pch=2,cex=2) igure 7: Red dots are from interpolation of the SPX log-strip; green dots are forward variance swap estimates from SPX variance swap quotes; blue dots are forward variance swap estimates from the linear VIX option strip.

28 Consistency of forward variance swap estimates orward variance swap estimates from SPX and VIX are very consistent on this date. Sometimes, VIX futures trade inconsistently with the forward-starting variance swap, typically at a premium. his arbitrage has come and gone over time. aking advantage as a proprietary trader is difficult because you need to cross the bid-ask so often. Buy the long dated variance swap, sell the shorter-dated variance swap. Sell the linear strip of VIX options. However, the practical consequence is that end users should determine whether SPX options or VIX futures are richer and buy or sell accordingly. Another date: 14-Aug-214 In [18]: load("spxvix rdata") load("fitqr14814.rdata") SPX smiles with SVI fits as of 14-Aug-214

29 In [19]: res <- plotivols(spxoptdata,svimatrix=fitqr) texp <- res$expiries Variance swap curve (from log-strips) as of 14-Aug-214

30 In [2]: svivs <- sqrt(svivarswap(fitqr,texp=res$expiries)) plot(texp,svivs,ylab="variance swap level", xlab="expiry",type="p",pch=2,cex=2, col="dark green") VIX smiles as of 14-Aug-214

31 In [21]: res <- plotivols(vixoptdata) orward starting variance swaps from interpolation of the SPX log-strips In [22]: spxdates <- unique(spxoptdata$exp) vsstrip <- function(tout){stinterp(spxdates,svivs,tout)$y} wis <- vsstrip(vixdates)^2*vixdates wfs <- vsstrip(vixdates+1/12)^2*(vixdates+1/12) vfstrip <- (wfs-wis)*12 sqrt(vfstrip) [1]

32 orward starting variance swaps from linear strip of VIX options In [23]: print(vix2n <- sapply(1:6,function(x){sqrt(vix2(vixoptdata,x))/1})) [1] In [24]: plot(vixdates,vix2n,xlab="vix option expiry", ylab="orward variance swap",type= "p",col="blue",pch=2, cex=2,ylim=c(.12,.2)) points(vixdates, sqrt(vfstrip),col="red",pch=2,cex=2) igure 6: Red dots are from interpolation of the SPX log-strips; Blue dots are forward variance swap estimates from the linear VIX option strip.

33 Consistency of forward variance swap estimates It seems as if variance swaps were trading at a premium to VIX options on 14-Aug-214. However, the front VIX options, which are the most liquid, seem to be in line. he VVIX index ( ( Recall that we may compute the fair value of quadratic variation of options: E[ log S ] = 2 E[log S ]. log S from the log-strip of SPX We may also compute the fair value of quadratic variation of options: log VIX E[ log VIX ] = 2 E[log VI X ]. from the log-strip of VIX he VVIX index (VIX of VIX) is computed from the log-strip of VIX options in exactly the same way that VIX is computed from SPX options. Roughly speaking, the VVIX index is the fair value of one-month quadratic variation of VIX. We then, again roughly speaking, also have a measure of the volatility of volatility. If VIX is a measure of volatility, VVIX should be a measure of volatility of volatility. ull details of the CBOE VVIX computation are given in (

34 VVIX as of 14-Aug-214 Here is another screenshot from Bloomberg: he fair value of VIX futures As before, we have VIX = E[VIX] and E[VI ] (E[VIX] = E[VI ] = Var(VIX). X 2 ) 2 X 2 2 VIX Recall that E[VI X 2 ] may be computed from a constant strip of VIX options. As for Var(VIX), we have Var(VIX) VIX 2 VVIX 2 so E[VI X 2 ] VIX 2 (1 + VVIX 2 ) which gives yet another way of assessing the fair value of VIX futures. VIX and VVIX as of 14-Aug-214 he nearest VIX future contract (Sep-214) closed at 13.9.

35 In [25]: print(vixdates*365.25) vix2n [1] [1] hus our linear strip computation gives Compare this with E [VI X 2 ] VIX 2 (1 + VVIX 2 ) ( 12 ) = In other words, VVIX proxies for the convexity adjustment in the comparison of the forward-starting SPX variance swap with the VIX future. Joint modeling of SPX and VIX We had so much success with model-free computations, why should we want to model SPX and VIX jointly? We may want to value exotic options that are sensitive to the precise dynamics of the underlying such as barrier options, lookbacks or cliquets. But is it possible to come up with a parsimonious, realistic model that fits SPX and VIX jointly? And even if we could, would it be possible to calibrate such a model efficiently? his is still a hot research topic. Information in VIX options As with options on the underlying, knowledge of the following is equivalent: he VIX implied volatility smile VIX option prices he VIX density he VIX characteristic function he VIX option smile thus encodes information about the dynamics of volatility in a stochastic volatility model. or example, under stochastic volatility, a very long-dated VIX smile would give us the stable distribution of VIX (should it exist).

36 Modeling forward variance As mentioned earlier in Session 1, forward variances are natural fundamental objects to consider for volatility modeling. Denote the variance curve as of time t by t () = E [ t v s ds t ] ξ t () := E [ v t ] () = () is given by ξ t t.. he forward variance A natural way of satisfying the martingale constraint whilst ensuring positivity is to impose lognormal dynamics as in Dupire s (1993) example: σ( ) for some volatility function. d ξ t (u) (u) ξ t Most approaches to joint modeling of SPX and VIX are effectively extensions of this idea to n- factors. = σ(u t) d W t Variance curve models he idea (similar to the stochastic implied volatility idea) is to obtain a factor model for forward variance swaps. hat is, ξ t (u) = G(z; u t) z = { z 1, z 2,..., z n } z j G( ) with for some factors and some variance curve functional. Specifically, we want (4) z to be a diffusion so that d d z t = μ( z t ) dt + σ j ( z ) d j t Wt j μ σ n Note that both and are dimensional vectors. Buehler s affine variance curve functional Consider the following variance curve functional: G(z; τ) = z 3 + ( z 1 z 3 ) e κ τ κ + ( z 2 z 3 ) ( ) κ c e c τ e κ τ his looks like the Svensson parametrization of the yield curve. he short end of the curve is given by z 1 and the long end by z 3. he middle level z 2 adds flexibility permitting for example a hump in the curve.

37 Double mean-reverting (DMR) dynamics One model consistent with Buehler s affine variance curve functional, is the double mean reverting (DMR) model explored in [Bayer, Gatheral and Karlsmark] which takes the form: (5) ds S = z 1 dw dz 1 = κ ( z 1 z 2 ) dt + ξ 1 z α 1 d Z 1 dz 2 = c ( z 2 z 3 ) dt + ξ 2 z β 2 dz 2 α, β [1/2, 1] for any choice of. z 1 z 2 κ z 2 All such models involve a short term variance level that reverts to a moving level at rate. reverts to the long-term level z 3 at the slower rate c < κ. Discriminating between SV models using VIX options We now use the DMR model to demonstrate how VIX options enable us to restrict modeling choices. Again the idea is that VIX option prices should allow us to discriminate between models. it of Double Lognormal model to VIX options As of 3-Apr-27, from Monte Carlo simulation with parameters z 1 =.137; z 2 =.28; z 3 =.421; κ = 12; ξ 1 = 7; c =.34; ξ 2 =.94; α = β = 1; we get the following fits (orange lines):

38

39 it of Double Heston model to VIX options As of 3-Apr-27, from Monte Carlo simulation with parameters z 1 =.137; z 2 =.28; z 3 =.421; κ = 12; ξ 1 =.7; c =.34; ξ 2 =.14; α = β = 1/2; we get the following fits (orange lines): Pros and cons of the DMR model On the pro side, the DMR model fits both SPX and VIX smiles remarkably well. On the other hand, there is no closed-form solution for European options so calibration is slow (read impractical).

40 Other modeling approaches [1] [Bergomi] uses effectively a sum of lognormals to replicate the upwards sloping smile in the VIX. Pro: More realistic diffusion dynamics. Con: ractability even worse than DMR; Monte Carlo is required for all computations. [3] [Cont and Kokholm] model SPX and VIX jointly using Lévy processes. heir specification has simultaneous jumps in the price and volatility. Pro: Vanilla options on VIX and variance swaps are easy to price using characteristic function methods. Vanilla options on SPX are computed using a mixing formula. So reasonably tractable. Con: Dynamics are unrealistic. [8] he Beta SVJ model of [Sepp] uses jumps as a proxy for volatility risk premium. According to Sepp's calibration of the Best SVJ model to the SPX volatility surface, there are simultaneous jumps of down almost 3% in the SPX and up 3% in variance with rate 8.6%. his would make suitably chosen barrier options and binaries (for example) very valuable. On the other hand, the connection between the statistical measure and the pricing measure is carefully explored. And there is an accurate approximation for pricing European options. Quote from Cont and Kokholm In reference to the empirical success of the variance swap rebalancing strategy (4), Cont and Kokholm make the following comment: he fact that the tracking error associated with this hedging strategy is found to be small in historical data does not entail that the contribution of jumps to the pricing of variance swaps is negligible. his common fallacy is akin to saying that since crashes occur infrequently, deep out-of-the-money puts should be priced at zero: recent experience shows that such mistaken assertions can be costly. and then also Moreover, jumps in volatility are also important in order to produce the positive skew of implied volatilities of VIX options.

41 We beg to disagree: Using jumps as a proxy for risk premium can itself be very dangerous. If there are large jumps under the pricing measure, we should be prepared to pay high prices for contracts that intuitively have little value. Consider a hyphothetical guaranteed stop-loss contract for example. In our view, the SPX is best modeled using a continuous diffusion process. More modeling philosophy here are at least two very different reasons for modeling in general and joint modeling of SPX and VIX in particular: 1. o price and hedge options in a large portfolio of exotic options. 2. o assess the fair value of options in both absolute and relative terms. Models such as the Karasinski-Sepp model have many parameters and can thus be calibrated to fit not only vanillas but also exotic options such as cliquets. Such models are of interest to exotic derivative book runners. However it is not clear that exotic contracts such as cliquets are being fairly priced. he rough volatility model that we will explore in Session 6 is an example of the second class of model. Such models are primarily of interest to traders and market makers. Summary Volatility derivatives are now very actively traded, not least because from a practical perspective, valuation is well-understood. We saw that although the relationship between the valuation of options on variance and European option prices is currently only partially understood, it s pretty clear from a practical perspective how to value them. On the theoretical side, connections between the valuation of volatility derivatives and the dynamics of the underlying process continue to be investigated.

42 References 1. ^ Lorenzo Bergomi, Smile dynamics III, Risk Magazine, 9-96 (October 28). 2. ^ Peter Carr and Dilip Madan, owards a theory of volatility trading, in Volatility: New estimation techniques for pricing derivatives, Risk Publications, Robert Jarrow, ed., (1998). 3. ^ Rama Cont and homas Kokholm, A consistent pricing model for index options and volatility derivatives, Mathematical inance 23(2) (213). 4. ^ Masaaki ukaswawa, he normalizing transformation of the implied volatility smile, Mathematical inance 22(4) (212). 5. ^ Masaaki ukaswawa, Volatility Derivatives and Model-free Implied Leverage, International Journal of heoretical and Applied inance 17(1) 1452 (214). 6. ^ Jim Gatheral, he Volatility Surface: A Practitioner's Guide, John Wiley and Sons, Hoboken, NJ (26). 7. ^ Artur Sepp, Empirical calbration and minimum variance delta under log-normal stochastic volatility dynamics, SSRN (214). In [ ]:

Lecture 5: Volatility and Variance Swaps

Lecture 5: Volatility and Variance Swaps Lecture 5: Volatility and Variance Swaps Jim Gatheral, Merrill Lynch Case Studies in inancial Modelling Course Notes, Courant Institute of Mathematical Sciences, all Term, 21 I am grateful to Peter riz

More information

Developments in Volatility Derivatives Pricing

Developments in Volatility Derivatives Pricing Developments in Volatility Derivatives Pricing Jim Gatheral Global Derivatives 2007 Paris, May 23, 2007 Motivation We would like to be able to price consistently at least 1 options on SPX 2 options on

More information

Valuation of Volatility Derivatives. Jim Gatheral Global Derivatives & Risk Management 2005 Paris May 24, 2005

Valuation of Volatility Derivatives. Jim Gatheral Global Derivatives & Risk Management 2005 Paris May 24, 2005 Valuation of Volatility Derivatives Jim Gatheral Global Derivatives & Risk Management 005 Paris May 4, 005 he opinions expressed in this presentation are those of the author alone, and do not necessarily

More information

A Consistent Pricing Model for Index Options and Volatility Derivatives

A Consistent Pricing Model for Index Options and Volatility Derivatives A Consistent Pricing Model for Index Options and Volatility Derivatives 6th World Congress of the Bachelier Society Thomas Kokholm Finance Research Group Department of Business Studies Aarhus School of

More information

Advanced Topics in Derivative Pricing Models. Topic 4 - Variance products and volatility derivatives

Advanced Topics in Derivative Pricing Models. Topic 4 - Variance products and volatility derivatives Advanced Topics in Derivative Pricing Models Topic 4 - Variance products and volatility derivatives 4.1 Volatility trading and replication of variance swaps 4.2 Volatility swaps 4.3 Pricing of discrete

More information

Simple Robust Hedging with Nearby Contracts

Simple Robust Hedging with Nearby Contracts Simple Robust Hedging with Nearby Contracts Liuren Wu and Jingyi Zhu Baruch College and University of Utah October 22, 2 at Worcester Polytechnic Institute Wu & Zhu (Baruch & Utah) Robust Hedging with

More information

Exploring Volatility Derivatives: New Advances in Modelling. Bruno Dupire Bloomberg L.P. NY

Exploring Volatility Derivatives: New Advances in Modelling. Bruno Dupire Bloomberg L.P. NY Exploring Volatility Derivatives: New Advances in Modelling Bruno Dupire Bloomberg L.P. NY bdupire@bloomberg.net Global Derivatives 2005, Paris May 25, 2005 1. Volatility Products Historical Volatility

More information

Simple Robust Hedging with Nearby Contracts

Simple Robust Hedging with Nearby Contracts Simple Robust Hedging with Nearby Contracts Liuren Wu and Jingyi Zhu Baruch College and University of Utah April 29, 211 Fourth Annual Triple Crown Conference Liuren Wu (Baruch) Robust Hedging with Nearby

More information

Dynamic Relative Valuation

Dynamic Relative Valuation Dynamic Relative Valuation Liuren Wu, Baruch College Joint work with Peter Carr from Morgan Stanley October 15, 2013 Liuren Wu (Baruch) Dynamic Relative Valuation 10/15/2013 1 / 20 The standard approach

More information

Optimal Hedging of Variance Derivatives. John Crosby. Centre for Economic and Financial Studies, Department of Economics, Glasgow University

Optimal Hedging of Variance Derivatives. John Crosby. Centre for Economic and Financial Studies, Department of Economics, Glasgow University Optimal Hedging of Variance Derivatives John Crosby Centre for Economic and Financial Studies, Department of Economics, Glasgow University Presentation at Baruch College, in New York, 16th November 2010

More information

Modeling the Implied Volatility Surface. Jim Gatheral Global Derivatives and Risk Management 2003 Barcelona May 22, 2003

Modeling the Implied Volatility Surface. Jim Gatheral Global Derivatives and Risk Management 2003 Barcelona May 22, 2003 Modeling the Implied Volatility Surface Jim Gatheral Global Derivatives and Risk Management 2003 Barcelona May 22, 2003 This presentation represents only the personal opinions of the author and not those

More information

Chapter 15: Jump Processes and Incomplete Markets. 1 Jumps as One Explanation of Incomplete Markets

Chapter 15: Jump Processes and Incomplete Markets. 1 Jumps as One Explanation of Incomplete Markets Chapter 5: Jump Processes and Incomplete Markets Jumps as One Explanation of Incomplete Markets It is easy to argue that Brownian motion paths cannot model actual stock price movements properly in reality,

More information

FX Smile Modelling. 9 September September 9, 2008

FX Smile Modelling. 9 September September 9, 2008 FX Smile Modelling 9 September 008 September 9, 008 Contents 1 FX Implied Volatility 1 Interpolation.1 Parametrisation............................. Pure Interpolation.......................... Abstract

More information

Calibration Lecture 4: LSV and Model Uncertainty

Calibration Lecture 4: LSV and Model Uncertainty Calibration Lecture 4: LSV and Model Uncertainty March 2017 Recap: Heston model Recall the Heston stochastic volatility model ds t = rs t dt + Y t S t dw 1 t, dy t = κ(θ Y t ) dt + ξ Y t dw 2 t, where

More information

Lecture 3: Asymptotics and Dynamics of the Volatility Skew

Lecture 3: Asymptotics and Dynamics of the Volatility Skew Lecture 3: Asymptotics and Dynamics of the Volatility Skew Jim Gatheral, Merrill Lynch Case Studies in Financial Modelling Course Notes, Courant Institute of Mathematical Sciences, Fall Term, 2001 I am

More information

Managing the Newest Derivatives Risks

Managing the Newest Derivatives Risks Managing the Newest Derivatives Risks Michel Crouhy IXIS Corporate and Investment Bank / A subsidiary of NATIXIS Derivatives 2007: New Ideas, New Instruments, New markets NYU Stern School of Business,

More information

The Black-Scholes Model

The Black-Scholes Model IEOR E4706: Foundations of Financial Engineering c 2016 by Martin Haugh The Black-Scholes Model In these notes we will use Itô s Lemma and a replicating argument to derive the famous Black-Scholes formula

More information

Volatility Smiles and Yield Frowns

Volatility Smiles and Yield Frowns Volatility Smiles and Yield Frowns Peter Carr NYU CBOE Conference on Derivatives and Volatility, Chicago, Nov. 10, 2017 Peter Carr (NYU) Volatility Smiles and Yield Frowns 11/10/2017 1 / 33 Interest Rates

More information

Lecture 4: Barrier Options

Lecture 4: Barrier Options Lecture 4: Barrier Options Jim Gatheral, Merrill Lynch Case Studies in Financial Modelling Course Notes, Courant Institute of Mathematical Sciences, Fall Term, 2001 I am grateful to Peter Friz for carefully

More information

The vanna-volga method for implied volatilities

The vanna-volga method for implied volatilities CUTTING EDGE. OPTION PRICING The vanna-volga method for implied volatilities The vanna-volga method is a popular approach for constructing implied volatility curves in the options market. In this article,

More information

Local Variance Gamma Option Pricing Model

Local Variance Gamma Option Pricing Model Local Variance Gamma Option Pricing Model Peter Carr at Courant Institute/Morgan Stanley Joint work with Liuren Wu June 11, 2010 Carr (MS/NYU) Local Variance Gamma June 11, 2010 1 / 29 1 Automated Option

More information

CONSTRUCTING NO-ARBITRAGE VOLATILITY CURVES IN LIQUID AND ILLIQUID COMMODITY MARKETS

CONSTRUCTING NO-ARBITRAGE VOLATILITY CURVES IN LIQUID AND ILLIQUID COMMODITY MARKETS CONSTRUCTING NO-ARBITRAGE VOLATILITY CURVES IN LIQUID AND ILLIQUID COMMODITY MARKETS Financial Mathematics Modeling for Graduate Students-Workshop January 6 January 15, 2011 MENTOR: CHRIS PROUTY (Cargill)

More information

Hedging Under Jump Diffusions with Transaction Costs. Peter Forsyth, Shannon Kennedy, Ken Vetzal University of Waterloo

Hedging Under Jump Diffusions with Transaction Costs. Peter Forsyth, Shannon Kennedy, Ken Vetzal University of Waterloo Hedging Under Jump Diffusions with Transaction Costs Peter Forsyth, Shannon Kennedy, Ken Vetzal University of Waterloo Computational Finance Workshop, Shanghai, July 4, 2008 Overview Overview Single factor

More information

Applying the Principles of Quantitative Finance to the Construction of Model-Free Volatility Indices

Applying the Principles of Quantitative Finance to the Construction of Model-Free Volatility Indices Applying the Principles of Quantitative Finance to the Construction of Model-Free Volatility Indices Christopher Ting http://www.mysmu.edu/faculty/christophert/ Christopher Ting : christopherting@smu.edu.sg

More information

Market interest-rate models

Market interest-rate models Market interest-rate models Marco Marchioro www.marchioro.org November 24 th, 2012 Market interest-rate models 1 Lecture Summary No-arbitrage models Detailed example: Hull-White Monte Carlo simulations

More information

Weighted Variance Swap

Weighted Variance Swap Weighted Variance Swap Roger Lee University of Chicago February 17, 9 Let the underlying process Y be a semimartingale taking values in an interval I. Let ϕ : I R be a difference of convex functions, and

More information

MFE/3F Questions Answer Key

MFE/3F Questions Answer Key MFE/3F Questions Download free full solutions from www.actuarialbrew.com, or purchase a hard copy from www.actexmadriver.com, or www.actuarialbookstore.com. Chapter 1 Put-Call Parity and Replication 1.01

More information

1. What is Implied Volatility?

1. What is Implied Volatility? Numerical Methods FEQA MSc Lectures, Spring Term 2 Data Modelling Module Lecture 2 Implied Volatility Professor Carol Alexander Spring Term 2 1 1. What is Implied Volatility? Implied volatility is: the

More information

Hedging Credit Derivatives in Intensity Based Models

Hedging Credit Derivatives in Intensity Based Models Hedging Credit Derivatives in Intensity Based Models PETER CARR Head of Quantitative Financial Research, Bloomberg LP, New York Director of the Masters Program in Math Finance, Courant Institute, NYU Stanford

More information

Smile in the low moments

Smile in the low moments Smile in the low moments L. De Leo, T.-L. Dao, V. Vargas, S. Ciliberti, J.-P. Bouchaud 10 jan 2014 Outline 1 The Option Smile: statics A trading style The cumulant expansion A low-moment formula: the moneyness

More information

Pricing Barrier Options under Local Volatility

Pricing Barrier Options under Local Volatility Abstract Pricing Barrier Options under Local Volatility Artur Sepp Mail: artursepp@hotmail.com, Web: www.hot.ee/seppar 16 November 2002 We study pricing under the local volatility. Our research is mainly

More information

2 f. f t S 2. Delta measures the sensitivityof the portfolio value to changes in the price of the underlying

2 f. f t S 2. Delta measures the sensitivityof the portfolio value to changes in the price of the underlying Sensitivity analysis Simulating the Greeks Meet the Greeks he value of a derivative on a single underlying asset depends upon the current asset price S and its volatility Σ, the risk-free interest rate

More information

Stochastic Volatility (Working Draft I)

Stochastic Volatility (Working Draft I) Stochastic Volatility (Working Draft I) Paul J. Atzberger General comments or corrections should be sent to: paulatz@cims.nyu.edu 1 Introduction When using the Black-Scholes-Merton model to price derivative

More information

Volatility Smiles and Yield Frowns

Volatility Smiles and Yield Frowns Volatility Smiles and Yield Frowns Peter Carr NYU IFS, Chengdu, China, July 30, 2018 Peter Carr (NYU) Volatility Smiles and Yield Frowns 7/30/2018 1 / 35 Interest Rates and Volatility Practitioners and

More information

Derivative Securities

Derivative Securities Derivative Securities he Black-Scholes formula and its applications. his Section deduces the Black- Scholes formula for a European call or put, as a consequence of risk-neutral valuation in the continuous

More information

Towards a Theory of Volatility Trading. by Peter Carr. Morgan Stanley. and Dilip Madan. University of Maryland

Towards a Theory of Volatility Trading. by Peter Carr. Morgan Stanley. and Dilip Madan. University of Maryland owards a heory of Volatility rading by Peter Carr Morgan Stanley and Dilip Madan University of Maryland Introduction hree methods have evolved for trading vol:. static positions in options eg. straddles.

More information

Sensex Realized Volatility Index (REALVOL)

Sensex Realized Volatility Index (REALVOL) Sensex Realized Volatility Index (REALVOL) Introduction Volatility modelling has traditionally relied on complex econometric procedures in order to accommodate the inherent latent character of volatility.

More information

Multiscale Stochastic Volatility Models

Multiscale Stochastic Volatility Models Multiscale Stochastic Volatility Models Jean-Pierre Fouque University of California Santa Barbara 6th World Congress of the Bachelier Finance Society Toronto, June 25, 2010 Multiscale Stochastic Volatility

More information

MFE/3F Questions Answer Key

MFE/3F Questions Answer Key MFE/3F Questions Download free full solutions from www.actuarialbrew.com, or purchase a hard copy from www.actexmadriver.com, or www.actuarialbookstore.com. Chapter 1 Put-Call Parity and Replication 1.01

More information

Tangent Lévy Models. Sergey Nadtochiy (joint work with René Carmona) Oxford-Man Institute of Quantitative Finance University of Oxford.

Tangent Lévy Models. Sergey Nadtochiy (joint work with René Carmona) Oxford-Man Institute of Quantitative Finance University of Oxford. Tangent Lévy Models Sergey Nadtochiy (joint work with René Carmona) Oxford-Man Institute of Quantitative Finance University of Oxford June 24, 2010 6th World Congress of the Bachelier Finance Society Sergey

More information

1.1 Basic Financial Derivatives: Forward Contracts and Options

1.1 Basic Financial Derivatives: Forward Contracts and Options Chapter 1 Preliminaries 1.1 Basic Financial Derivatives: Forward Contracts and Options A derivative is a financial instrument whose value depends on the values of other, more basic underlying variables

More information

Equity correlations implied by index options: estimation and model uncertainty analysis

Equity correlations implied by index options: estimation and model uncertainty analysis 1/18 : estimation and model analysis, EDHEC Business School (joint work with Rama COT) Modeling and managing financial risks Paris, 10 13 January 2011 2/18 Outline 1 2 of multi-asset models Solution to

More information

Greek parameters of nonlinear Black-Scholes equation

Greek parameters of nonlinear Black-Scholes equation International Journal of Mathematics and Soft Computing Vol.5, No.2 (2015), 69-74. ISSN Print : 2249-3328 ISSN Online: 2319-5215 Greek parameters of nonlinear Black-Scholes equation Purity J. Kiptum 1,

More information

Lecture 4: Forecasting with option implied information

Lecture 4: Forecasting with option implied information Lecture 4: Forecasting with option implied information Prof. Massimo Guidolin Advanced Financial Econometrics III Winter/Spring 2016 Overview A two-step approach Black-Scholes single-factor model Heston

More information

INTEREST RATES AND FX MODELS

INTEREST RATES AND FX MODELS INTEREST RATES AND FX MODELS 4. Convexity Andrew Lesniewski Courant Institute of Mathematics New York University New York February 24, 2011 2 Interest Rates & FX Models Contents 1 Convexity corrections

More information

Risk managing long-dated smile risk with SABR formula

Risk managing long-dated smile risk with SABR formula Risk managing long-dated smile risk with SABR formula Claudio Moni QuaRC, RBS November 7, 2011 Abstract In this paper 1, we show that the sensitivities to the SABR parameters can be materially wrong when

More information

Portfolio Management Using Option Data

Portfolio Management Using Option Data Portfolio Management Using Option Data Peter Christoffersen Rotman School of Management, University of Toronto, Copenhagen Business School, and CREATES, University of Aarhus 2 nd Lecture on Friday 1 Overview

More information

The Black-Scholes Model

The Black-Scholes Model The Black-Scholes Model Liuren Wu Options Markets Liuren Wu ( c ) The Black-Merton-Scholes Model colorhmoptions Markets 1 / 18 The Black-Merton-Scholes-Merton (BMS) model Black and Scholes (1973) and Merton

More information

Implied Volatility Surface

Implied Volatility Surface Implied Volatility Surface Liuren Wu Zicklin School of Business, Baruch College Options Markets (Hull chapter: 16) Liuren Wu Implied Volatility Surface Options Markets 1 / 1 Implied volatility Recall the

More information

LIBOR models, multi-curve extensions, and the pricing of callable structured derivatives

LIBOR models, multi-curve extensions, and the pricing of callable structured derivatives Weierstrass Institute for Applied Analysis and Stochastics LIBOR models, multi-curve extensions, and the pricing of callable structured derivatives John Schoenmakers 9th Summer School in Mathematical Finance

More information

An arbitrage-free method for smile extrapolation

An arbitrage-free method for smile extrapolation An arbitrage-free method for smile extrapolation Shalom Benaim, Matthew Dodgson and Dherminder Kainth Royal Bank of Scotland A robust method for pricing options at strikes where there is not an observed

More information

IEOR E4602: Quantitative Risk Management

IEOR E4602: Quantitative Risk Management IEOR E4602: Quantitative Risk Management Basic Concepts and Techniques of Risk Management Martin Haugh Department of Industrial Engineering and Operations Research Columbia University Email: martin.b.haugh@gmail.com

More information

Pricing with a Smile. Bruno Dupire. Bloomberg

Pricing with a Smile. Bruno Dupire. Bloomberg CP-Bruno Dupire.qxd 10/08/04 6:38 PM Page 1 11 Pricing with a Smile Bruno Dupire Bloomberg The Black Scholes model (see Black and Scholes, 1973) gives options prices as a function of volatility. If an

More information

arxiv: v1 [q-fin.pr] 18 Feb 2010

arxiv: v1 [q-fin.pr] 18 Feb 2010 CONVERGENCE OF HESTON TO SVI JIM GATHERAL AND ANTOINE JACQUIER arxiv:1002.3633v1 [q-fin.pr] 18 Feb 2010 Abstract. In this short note, we prove by an appropriate change of variables that the SVI implied

More information

A New Framework for Analyzing Volatility Risk and Premium Across Option Strikes and Expiries

A New Framework for Analyzing Volatility Risk and Premium Across Option Strikes and Expiries A New Framework for Analyzing Volatility Risk and Premium Across Option Strikes and Expiries Liuren Wu, Baruch College Joint work with Peter Carr from Morgan Stanley Singapore Management University July

More information

ABSA Technical Valuations Session JSE Trading Division

ABSA Technical Valuations Session JSE Trading Division ABSA Technical Valuations Session JSE Trading Division July 2010 Presented by: Dr Antonie Kotzé 1 Some members are lost.. ABSA Technical Valuation Session Introduction 2 some think Safex talks in tongues.

More information

Hedging under Model Mis-Specification: Which Risk Factors Should You Not Forget?

Hedging under Model Mis-Specification: Which Risk Factors Should You Not Forget? Hedging under Model Mis-Specification: Which Risk Factors Should You Not Forget? Nicole Branger Christian Schlag Eva Schneider Norman Seeger This version: May 31, 28 Finance Center Münster, University

More information

A SUMMARY OF OUR APPROACHES TO THE SABR MODEL

A SUMMARY OF OUR APPROACHES TO THE SABR MODEL Contents 1 The need for a stochastic volatility model 1 2 Building the model 2 3 Calibrating the model 2 4 SABR in the risk process 5 A SUMMARY OF OUR APPROACHES TO THE SABR MODEL Financial Modelling Agency

More information

Pricing of a European Call Option Under a Local Volatility Interbank Offered Rate Model

Pricing of a European Call Option Under a Local Volatility Interbank Offered Rate Model American Journal of Theoretical and Applied Statistics 2018; 7(2): 80-84 http://www.sciencepublishinggroup.com/j/ajtas doi: 10.11648/j.ajtas.20180702.14 ISSN: 2326-8999 (Print); ISSN: 2326-9006 (Online)

More information

INTEREST RATES AND FX MODELS

INTEREST RATES AND FX MODELS INTEREST RATES AND FX MODELS 7. Risk Management Andrew Lesniewski Courant Institute of Mathematical Sciences New York University New York March 8, 2012 2 Interest Rates & FX Models Contents 1 Introduction

More information

Pricing Variance Swaps on Time-Changed Lévy Processes

Pricing Variance Swaps on Time-Changed Lévy Processes Pricing Variance Swaps on Time-Changed Lévy Processes ICBI Global Derivatives Volatility and Correlation Summit April 27, 2009 Peter Carr Bloomberg/ NYU Courant pcarr4@bloomberg.com Joint with Roger Lee

More information

IEOR E4703: Monte-Carlo Simulation

IEOR E4703: Monte-Carlo Simulation IEOR E4703: Monte-Carlo Simulation Simulating Stochastic Differential Equations Martin Haugh Department of Industrial Engineering and Operations Research Columbia University Email: martin.b.haugh@gmail.com

More information

AN ANALYTICALLY TRACTABLE UNCERTAIN VOLATILITY MODEL

AN ANALYTICALLY TRACTABLE UNCERTAIN VOLATILITY MODEL AN ANALYTICALLY TRACTABLE UNCERTAIN VOLATILITY MODEL FABIO MERCURIO BANCA IMI, MILAN http://www.fabiomercurio.it 1 Stylized facts Traders use the Black-Scholes formula to price plain-vanilla options. An

More information

Pricing Variance Swaps under Stochastic Volatility Model with Regime Switching - Discrete Observations Case

Pricing Variance Swaps under Stochastic Volatility Model with Regime Switching - Discrete Observations Case Pricing Variance Swaps under Stochastic Volatility Model with Regime Switching - Discrete Observations Case Guang-Hua Lian Collaboration with Robert Elliott University of Adelaide Feb. 2, 2011 Robert Elliott,

More information

The Black-Scholes Model

The Black-Scholes Model The Black-Scholes Model Liuren Wu Options Markets (Hull chapter: 12, 13, 14) Liuren Wu ( c ) The Black-Scholes Model colorhmoptions Markets 1 / 17 The Black-Scholes-Merton (BSM) model Black and Scholes

More information

A Brief Introduction to Stochastic Volatility Modeling

A Brief Introduction to Stochastic Volatility Modeling A Brief Introduction to Stochastic Volatility Modeling Paul J. Atzberger General comments or corrections should be sent to: paulatz@cims.nyu.edu Introduction When using the Black-Scholes-Merton model to

More information

Leverage Effect, Volatility Feedback, and Self-Exciting Market Disruptions 11/4/ / 24

Leverage Effect, Volatility Feedback, and Self-Exciting Market Disruptions 11/4/ / 24 Leverage Effect, Volatility Feedback, and Self-Exciting Market Disruptions Liuren Wu, Baruch College and Graduate Center Joint work with Peter Carr, New York University and Morgan Stanley CUNY Macroeconomics

More information

Introduction to Financial Mathematics

Introduction to Financial Mathematics Department of Mathematics University of Michigan November 7, 2008 My Information E-mail address: marymorj (at) umich.edu Financial work experience includes 2 years in public finance investment banking

More information

An Overview of Volatility Derivatives and Recent Developments

An Overview of Volatility Derivatives and Recent Developments An Overview of Volatility Derivatives and Recent Developments September 17th, 2013 Zhenyu Cui Math Club Colloquium Department of Mathematics Brooklyn College, CUNY Math Club Colloquium Volatility Derivatives

More information

Lecture 1: Stochastic Volatility and Local Volatility

Lecture 1: Stochastic Volatility and Local Volatility Lecture 1: Stochastic Volatility and Local Volatility Jim Gatheral, Merrill Lynch Case Studies in Financial Modelling Course Notes, Courant Institute of Mathematical Sciences, Fall Term, 2003 Abstract

More information

Using the Risk Neutral Density to Verify No Arbitrage in Implied Volatility by Fabrice Douglas Rouah

Using the Risk Neutral Density to Verify No Arbitrage in Implied Volatility by Fabrice Douglas Rouah Using the Risk Neutral Density to Verify No Arbitrage in Implied Volatility by Fabrice Douglas Rouah www.frouah.com www.volopta.com Constructing implied volatility curves that are arbitrage-free is crucial

More information

Analysis of the Models Used in Variance Swap Pricing

Analysis of the Models Used in Variance Swap Pricing Analysis of the Models Used in Variance Swap Pricing Jason Vinar U of MN Workshop 2011 Workshop Goals Price variance swaps using a common rule of thumb used by traders, using Monte Carlo simulation with

More information

Practical example of an Economic Scenario Generator

Practical example of an Economic Scenario Generator Practical example of an Economic Scenario Generator Martin Schenk Actuarial & Insurance Solutions SAV 7 March 2014 Agenda Introduction Deterministic vs. stochastic approach Mathematical model Application

More information

Variance Swaps in the Presence of Jumps

Variance Swaps in the Presence of Jumps Variance Swaps in the Presence of Jumps Max Schotsman July 1, 213 Abstract This paper analyses the proposed alternative of the variance swap, the simple variance swap. Its main advantage would be the insensitivity

More information

Volatility Investing with Variance Swaps

Volatility Investing with Variance Swaps Volatility Investing with Variance Swaps Wolfgang Karl Härdle Elena Silyakova Ladislaus von Bortkiewicz Chair of Statistics C.A.S.E. Centre for Applied Statistics and Economics School of Business and Economics

More information

Leverage Effect, Volatility Feedback, and Self-Exciting MarketAFA, Disruptions 1/7/ / 14

Leverage Effect, Volatility Feedback, and Self-Exciting MarketAFA, Disruptions 1/7/ / 14 Leverage Effect, Volatility Feedback, and Self-Exciting Market Disruptions Liuren Wu, Baruch College Joint work with Peter Carr, New York University The American Finance Association meetings January 7,

More information

Lecture Note 8 of Bus 41202, Spring 2017: Stochastic Diffusion Equation & Option Pricing

Lecture Note 8 of Bus 41202, Spring 2017: Stochastic Diffusion Equation & Option Pricing Lecture Note 8 of Bus 41202, Spring 2017: Stochastic Diffusion Equation & Option Pricing We shall go over this note quickly due to time constraints. Key concept: Ito s lemma Stock Options: A contract giving

More information

Rough volatility models

Rough volatility models Mohrenstrasse 39 10117 Berlin Germany Tel. +49 30 20372 0 www.wias-berlin.de October 18, 2018 Weierstrass Institute for Applied Analysis and Stochastics Rough volatility models Christian Bayer EMEA Quant

More information

Definition Pricing Risk management Second generation barrier options. Barrier Options. Arfima Financial Solutions

Definition Pricing Risk management Second generation barrier options. Barrier Options. Arfima Financial Solutions Arfima Financial Solutions Contents Definition 1 Definition 2 3 4 Contenido Definition 1 Definition 2 3 4 Definition Definition: A barrier option is an option on the underlying asset that is activated

More information

Pricing Volatility Derivatives with General Risk Functions. Alejandro Balbás University Carlos III of Madrid

Pricing Volatility Derivatives with General Risk Functions. Alejandro Balbás University Carlos III of Madrid Pricing Volatility Derivatives with General Risk Functions Alejandro Balbás University Carlos III of Madrid alejandro.balbas@uc3m.es Content Introduction. Describing volatility derivatives. Pricing and

More information

1 Implied Volatility from Local Volatility

1 Implied Volatility from Local Volatility Abstract We try to understand the Berestycki, Busca, and Florent () (BBF) result in the context of the work presented in Lectures and. Implied Volatility from Local Volatility. Current Plan as of March

More information

7 pages 1. Premia 14

7 pages 1. Premia 14 7 pages 1 Premia 14 Calibration of Stochastic Volatility model with Jumps A. Ben Haj Yedder March 1, 1 The evolution process of the Heston model, for the stochastic volatility, and Merton model, for the

More information

Pricing and Hedging of European Plain Vanilla Options under Jump Uncertainty

Pricing and Hedging of European Plain Vanilla Options under Jump Uncertainty Pricing and Hedging of European Plain Vanilla Options under Jump Uncertainty by Olaf Menkens School of Mathematical Sciences Dublin City University (DCU) Financial Engineering Workshop Cass Business School,

More information

TEST OF BOUNDED LOG-NORMAL PROCESS FOR OPTIONS PRICING

TEST OF BOUNDED LOG-NORMAL PROCESS FOR OPTIONS PRICING TEST OF BOUNDED LOG-NORMAL PROCESS FOR OPTIONS PRICING Semih Yön 1, Cafer Erhan Bozdağ 2 1,2 Department of Industrial Engineering, Istanbul Technical University, Macka Besiktas, 34367 Turkey Abstract.

More information

Mixing Di usion and Jump Processes

Mixing Di usion and Jump Processes Mixing Di usion and Jump Processes Mixing Di usion and Jump Processes 1/ 27 Introduction Using a mixture of jump and di usion processes can model asset prices that are subject to large, discontinuous changes,

More information

Introduction Random Walk One-Period Option Pricing Binomial Option Pricing Nice Math. Binomial Models. Christopher Ting.

Introduction Random Walk One-Period Option Pricing Binomial Option Pricing Nice Math. Binomial Models. Christopher Ting. Binomial Models Christopher Ting Christopher Ting http://www.mysmu.edu/faculty/christophert/ : christopherting@smu.edu.sg : 6828 0364 : LKCSB 5036 October 14, 2016 Christopher Ting QF 101 Week 9 October

More information

Hedging of Volatility

Hedging of Volatility U.U.D.M. Project Report 14:14 Hedging of Volatility Ty Lewis Examensarbete i matematik, 3 hp Handledare och examinator: Maciej Klimek Maj 14 Department of Mathematics Uppsala University Uppsala University

More information

Supplementary Appendix to The Risk Premia Embedded in Index Options

Supplementary Appendix to The Risk Premia Embedded in Index Options Supplementary Appendix to The Risk Premia Embedded in Index Options Torben G. Andersen Nicola Fusari Viktor Todorov December 214 Contents A The Non-Linear Factor Structure of Option Surfaces 2 B Additional

More information

Hedging Default Risks of CDOs in Markovian Contagion Models

Hedging Default Risks of CDOs in Markovian Contagion Models Hedging Default Risks of CDOs in Markovian Contagion Models Second Princeton Credit Risk Conference 24 May 28 Jean-Paul LAURENT ISFA Actuarial School, University of Lyon, http://laurent.jeanpaul.free.fr

More information

Robust Pricing and Hedging of Options on Variance

Robust Pricing and Hedging of Options on Variance Robust Pricing and Hedging of Options on Variance Alexander Cox Jiajie Wang University of Bath Bachelier 21, Toronto Financial Setting Option priced on an underlying asset S t Dynamics of S t unspecified,

More information

Economic Scenario Generator: Applications in Enterprise Risk Management. Ping Sun Executive Director, Financial Engineering Numerix LLC

Economic Scenario Generator: Applications in Enterprise Risk Management. Ping Sun Executive Director, Financial Engineering Numerix LLC Economic Scenario Generator: Applications in Enterprise Risk Management Ping Sun Executive Director, Financial Engineering Numerix LLC Numerix makes no representation or warranties in relation to information

More information

ESGs: Spoilt for choice or no alternatives?

ESGs: Spoilt for choice or no alternatives? ESGs: Spoilt for choice or no alternatives? FA L K T S C H I R S C H N I T Z ( F I N M A ) 1 0 3. M i t g l i e d e r v e r s a m m l u n g S AV A F I R, 3 1. A u g u s t 2 0 1 2 Agenda 1. Why do we need

More information

DRAFT. 1 exercise in state (S, t), π(s, t) = 0 do not exercise in state (S, t) Review of the Risk Neutral Stock Dynamics

DRAFT. 1 exercise in state (S, t), π(s, t) = 0 do not exercise in state (S, t) Review of the Risk Neutral Stock Dynamics Chapter 12 American Put Option Recall that the American option has strike K and maturity T and gives the holder the right to exercise at any time in [0, T ]. The American option is not straightforward

More information

Model Estimation. Liuren Wu. Fall, Zicklin School of Business, Baruch College. Liuren Wu Model Estimation Option Pricing, Fall, / 16

Model Estimation. Liuren Wu. Fall, Zicklin School of Business, Baruch College. Liuren Wu Model Estimation Option Pricing, Fall, / 16 Model Estimation Liuren Wu Zicklin School of Business, Baruch College Fall, 2007 Liuren Wu Model Estimation Option Pricing, Fall, 2007 1 / 16 Outline 1 Statistical dynamics 2 Risk-neutral dynamics 3 Joint

More information

The Implied Volatility Index

The Implied Volatility Index The Implied Volatility Index Risk Management Institute National University of Singapore First version: October 6, 8, this version: October 8, 8 Introduction This document describes the formulation and

More information

CONTINUOUS TIME PRICING AND TRADING: A REVIEW, WITH SOME EXTRA PIECES

CONTINUOUS TIME PRICING AND TRADING: A REVIEW, WITH SOME EXTRA PIECES CONTINUOUS TIME PRICING AND TRADING: A REVIEW, WITH SOME EXTRA PIECES THE SOURCE OF A PRICE IS ALWAYS A TRADING STRATEGY SPECIAL CASES WHERE TRADING STRATEGY IS INDEPENDENT OF PROBABILITY MEASURE COMPLETENESS,

More information

Optimal robust bounds for variance options and asymptotically extreme models

Optimal robust bounds for variance options and asymptotically extreme models Optimal robust bounds for variance options and asymptotically extreme models Alexander Cox 1 Jiajie Wang 2 1 University of Bath 2 Università di Roma La Sapienza Advances in Financial Mathematics, 9th January,

More information

Option P&L Attribution and Pricing

Option P&L Attribution and Pricing Option P&L Attribution and Pricing Liuren Wu joint with Peter Carr Baruch College March 23, 2018 Stony Brook University Carr and Wu (NYU & Baruch) P&L Attribution and Option Pricing March 23, 2018 1 /

More information

On VIX Futures in the rough Bergomi model

On VIX Futures in the rough Bergomi model On VIX Futures in the rough Bergomi model Oberwolfach Research Institute for Mathematics, February 28, 2017 joint work with Antoine Jacquier and Claude Martini Contents VIX future dynamics under rbergomi

More information

Implied Volatilities

Implied Volatilities Implied Volatilities Christopher Ting Christopher Ting http://www.mysmu.edu/faculty/christophert/ : christopherting@smu.edu.sg : 6828 0364 : LKCSB 5036 April 1, 2017 Christopher Ting QF 604 Week 2 April

More information