Markowitz Asset Allocation Dana Uhlig Tue Jun 26 13:27:

Size: px
Start display at page:

Download "Markowitz Asset Allocation Dana Uhlig Tue Jun 26 13:27:"

Transcription

1 Markowitz Asset Allocation Dana Uhlig Tue Jun 26 13:27: library(quantmod) ## Loading required package: xts ## Loading required package: zoo ## ## Attaching package: 'zoo' ## The following objects are masked from 'package:base': ## ## as.date, as.date.numeric ## Loading required package: TTR ## Version included new data defaults. See?getSymbols. ## Learn from a quantmod author: = ls()) #directory for graphics if (!dir.exists("./pics-out")) dir.create(path="pics-out") titles = c("dax","rwe","gold","oil","$/ ") all = c( ,12.870, , 34.9, , , , , 33.08, , , , , 33.77, , , , , 37.04, , , , , 43.71, , , , , 45.81, , , , , 46.04, , , , , 39.78, , , , , 43.35, , , , , 46.15, , , , , 44.95, , , , , 47.72, , , , , 52.69, ) S = matrix(all,ncol=5,byrow=true) nr.assets = dim(s)[2] n = dim(s)[1] colnames(s) = titles time = seq(from=as.date(' '),by="month",length.out=n) (S.xts = as.xts(s,frequency = 12, order.by = time)) 1

2 ## ## ## ## ## ## ## ## ## ## ## ## ## ############# help functions ############################################# #normalising function for rescaling assets (S0=1) normalise_series = function(xdat) xdat / coredata(xdat)[1] normalise_assetmatrix = function(assets){ n = dim(assets)[1] #sample size nr = dim(assets)[2] #assets } S.scaled = assets for (k in (1:nr)){ S.scaled[,k] = normalise_series(assets[,k]) } return(s.scaled) ######################## (S.scaled = normalise_assetmatrix(s.xts)) ## ## ## ## ## ## ## ## ## ## ## ## ## ### chart matplot(time,s.scaled,type='l',xaxt="n",col=1:nr.assets,xlab="",ylab="scaled prices",lwd=3) axis(side=1, at=time, labels = format(time,"%b %y")) legend("topleft", titles, col=1:nr.assets, lty=1:nr.assets,bty="n",lwd=1) 2

3 scaled prices DAX RWE gold oil $/ Jan 16 Mar 16 May 16 Jul 16 Sep 16 Nov 16 Jan 17 ### using ts / quantmod charts all.cols = topo.colors(nr.assets, alpha = 1) chart_series(s.scaled[,1], lwd=2, name="") 3

4 / Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec Jan Jan 2016 Feb 2016 Mar 2016 Apr 2016 May 2016 Jun 2016 Jul 2016 Aug 2016 Sep 2016 Oct 2016 Nov 2016 Dec 2016 Jan 2017 add_ta(s.scaled[,2], on = 1, col = all.cols[2], lty = 2,lwd=2) 4

5 / Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec Jan Jan 2016 Feb 2016 Mar 2016 Apr 2016 May 2016 Jun 2016 Jul 2016 Aug 2016 Sep 2016 Oct 2016 Nov 2016 Dec 2016 Jan 2017 add_ta(s.scaled[,3], on = 1, col = all.cols[3], lty = 3,lwd=2) 5

6 / Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec Jan Jan 2016 Feb 2016 Mar 2016 Apr 2016 May 2016 Jun 2016 Jul 2016 Aug 2016 Sep 2016 Oct 2016 Nov 2016 Dec 2016 Jan 2017 add_ta(s.scaled[,4], on = 1, col = all.cols[4], lty = 4,lwd=2) 6

7 / Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec Jan Jan 2016 Feb 2016 Mar 2016 Apr 2016 May 2016 Jun 2016 Jul 2016 Aug 2016 Sep 2016 Oct 2016 Nov 2016 Dec 2016 Jan 2017 add_ta(s.scaled[,5], on = 1, col = all.cols[5], lty = 5,lwd=2) legend("topleft", titles, col=all.cols, lty=1:nr.assets,bty="n",lwd=1) 7

8 DAX RWE / gold oil $/ Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec Jan Jan 2016 Feb 2016 Mar 2016 Apr 2016 May 2016 Jun 2016 Jul 2016 Aug 2016 Sep 2016 Oct 2016 Nov 2016 Dec 2016 Jan 2017 #################################################################################################### #alternative individual computation DAX = as.xts(s[,1],frequency = 12, order.by = time) RWE = as.xts(s[,2],frequency = 12, order.by = time) GOLD = as.xts(s[,3],frequency = 12, order.by = time) OIL = as.xts(s[,4],frequency = 12, order.by = time) USEUR = as.xts(s[,5],frequency = 12, order.by = time) DAX.scaled = normalise_series(dax) RWE.scaled = normalise_series(rwe) GOLD.scaled = normalise_series(gold) OIL.scaled = normalise_series(oil) USEUR.scaled = normalise_series(useur) ############################################################################## #matrix of annulized returns (Xi = 12*diff(log(S))) ## [1,] ## [2,] ## [3,]

9 ## [4,] ## [5,] ## [6,] ## [7,] ## [8,] ## [9,] ## [10,] ## [11,] ## [12,] #script table 3.2 annulized returns Xi * 100 ## [1,] ## [2,] ## [3,] ## [4,] ## [5,] ## [6,] ## [7,] ## [8,] ## [9,] ## [10,] ## [11,] ## [12,] #factor 12 for annualized returns: 1/as.numeric(time[n]-time[1])*as.numeric(time[2]-time[1]) ## [1] /12 ## [1] /as.numeric(time[n]-time[1])*as.numeric(diff(time)) ## [1] ## [7] /12 ## [1] #same as S.scaled after removing first line (NA)! 12*diff(log(S.scaled))[-1,] ## ## ## ## ## ## ## ## ## ##

10 ## ## #or individual monthlyreturn(dax,type = 'log') ## monthly.returns ## ## ## ## ## ## ## ## ## ## ## ## ## monthlyreturn(dax,type = 'arithmetic') ## monthly.returns ## ## ## ## ## ## ## ## ## ## ## ## ## DAX.ret.month = monthlyreturn(dax,type='log')[-1] #same as for scaled prices, since log(s_t / S_{t-1})= log((s_t/s_0) / (S_{t-1}/S_0)) norm(monthlyreturn(dax.scaled) - monthlyreturn(dax)) ## [1] e-16 #caution! There are some small differnces (due to time scaling????) cbind(dax.ret.month * 12,Xi[,1]) ## monthly.returns..2 ## ## ## ## ## ## ## ## ##

11 ## ## ## cbind(xi[,1], 12*DAX.ret.month,as.numeric(time[n]-time[1])*(1/as.numeric(diff(time)))*DAX.ret.month) ##..1 monthly.returns monthly.returns.1 ## ## ## ## ## ## ## ## ## ## ## ## norm(xi[,1] - 12*DAX.ret.month) ## [1] e-14 norm(xi[,1] - as.numeric(time[n]-time[1])*(1/as.numeric(diff(time)))*dax.ret.month) ## [1] RWE.ret.month = monthlyreturn(rwe,type = 'log')[-1] GOLD.ret.month =monthlyreturn(gold,type = 'log')[-1] OIL.ret.month = monthlyreturn(oil,type = 'log')[-1] USEUR.ret.month = monthlyreturn(useur,type = 'log')[-1] (Xi.alternative = cbind(dax.ret.month, RWE.ret.month, GOLD.ret.month, OIL.ret.month, USEUR.ret.month)*12 ## monthly.returns monthly.returns.1 monthly.returns.2 ## ## ## ## ## ## ## ## ## ## ## ## ## monthly.returns.3 monthly.returns.4 ## ## ## ## ## ## ## ##

12 ## ## ## ## Xi ## [1,] ## [2,] ## [3,] ## [4,] ## [5,] ## [6,] ## [7,] ## [8,] ## [9,] ## [10,] ## [11,] ## [12,] ######################################################################################################## #estimation of covariance matrix and expected returns #first moment: expected annulized returns r=colmeans(xi) #table 3.3 first line - mean r*100 ## #alternative computation apply(x=xi,margin = 2,FUN = mean) ## r ## #second moment: variance #unbiased variance estimator apply(x=xi, MARGIN = 2, FUN = var) ## #biased variance estimator (table 3.3 second line) apply(x=xi, MARGIN = 2, FUN = var) * (n-1)/n ## #covariance, unbiased (better estimator than biased version used in script!) (C.unbiased = cov(xi)) 12

13 ## DAX ## RWE ## gold ## oil ## $/\ #diagonal = variances apply(x=xi, MARGIN = 2, FUN = var) ## diag(c.unbiased) ## #biased covariance = version script Pichler (C.biased = C.unbiased*(n-1)/n) ## DAX ## RWE ## gold ## oil ## $/\ #variances on diagonal apply(x=xi, MARGIN = 2, FUN = var)*(n-1)/n ## diag(c.biased) ## ######################################################################## # CAPM Markowitz: min( portfoliovar(x)) such that: expected portfolio mean(x) >= mu and sum(x)<=1 #see Theorem 3.12 (1. step: we compute the efficient portfolios for a given expected portfolio return (s # and later we write a function for doing this (step 2) C = C.biased #because this version is used in the lecture notes #(even using the unbiased estimator is better!!!) #step 1: C.inv = solve(c) #table 3.4 (a) and 3.4 (b) round(c*100,2) ## DAX ## RWE ## gold ## oil ## $/\

14 round(c.inv,2) ## DAX ## RWE ## gold ## oil ## $/\ #test C.inv %*% C ## DAX e e e e e-17 ## RWE e e e e e-17 ## gold e e e e e-17 ## oil e e e e e-17 ## $/\ e e e e e+00 C %*% C.inv ## DAX e e e e e-17 ## RWE e e e e e-15 ## gold e e e e e-16 ## oil e e e e e-16 ## $/\ e e e e e+00 #computation of efficient Markowirtz portfolio via formula (3.5) ones = rep(1,nr.assets) a = as.numeric(r%*% C.inv %*% r) b = as.numeric(r%*% C.inv %*% ones ) c = as.numeric(ones %*% C.inv %*% ones ) d = a*c-b*b mu = seq(from=0.00,to = 0.25,by=0.01) m = length(mu) xm = matrix(nrow = nr.assets, ncol=m) for (k in 1:m){ xm[,k]= a*c.inv%*%ones- b*c.inv%*%r+ mu[k]*(c*c.inv%*%r -b*c.inv%*%ones) } xm = xm/d row.names(xm) = titles colsums(xm) ## [1] xm<0 ## [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] ## DAX FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ## RWE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ## gold FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 14

15 ## oil TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE ## $/\200 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ## [,12] [,13] [,14] [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] ## DAX FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ## RWE FALSE FALSE FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ## gold FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ## oil FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ## $/\200 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ## [,23] [,24] [,25] [,26] ## DAX FALSE FALSE FALSE FALSE ## RWE TRUE TRUE TRUE TRUE ## gold FALSE FALSE FALSE FALSE ## oil FALSE FALSE FALSE FALSE ## $/\200 FALSE FALSE FALSE FALSE standarddev = sqrt((mu^2*c-2*mu*b+a)/d) plot(mu,standarddev,type="l",main="standard deviation of the optimal portfolio in dependence of mu") Standard deviation of the optimal portfolio in dependence of mu standarddev mu matplot(mu,t(xm),type='l',col=1:nr.assets,lty=1:nr.assets,ylab="x*",main="asset allocation") legend("topright", titles, col=1:nr.assets, lty=1:nr.assets,bty="n",lwd=1) 15

16 asset allocation x* DAX RWE gold oil $/ mu ######################################################################################################## # function for creating asset allocation plot (see script figure 3.4 and 3.6) graph.asset.allocation = function(portfolio,sd,mu, png.name="optimal-asset-allocation-mu.png",title="mar nr = dim(portfolio)[1] titles = row.names(portfolio) print(portfolio) print(titles) } par(mar=c(5,4,4,5)+.1) plot(mu,t(portfolio[1,]),ylim=c(min(portfolio),max(portfolio)),type='l',col=1,lty=1,ylab="x* asset all for (j in 2:nr) lines(mu,t(portfolio[j,]),type='l',col=j,lty=j) par(new=true) plot(mu, sd,type="l",col="darkgray",lwd=3,lty=6,xaxt="n",yaxt="n",xlab="",ylab="") axis(4) mtext("sd(x*(mu))",side=4,line=3,col="darkgray") legend("topleft", c(titles), col=c(1:nr), lty=1:nr,bty="n",lwd=rep(1,nr)) dev.copy(png,paste("pics-out/",png.name,sep="")) dev.off() graph.asset.allocation(portfolio=xm,sd=standarddev, mu=mu,png.name = 'test.png') ## [,1] [,2] [,3] [,4] [,5] ## DAX

17 ## RWE ## gold ## oil ## $/\ ## [,6] [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE ## gold ## oil ## $/\ ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## [,22] [,23] [,24] [,25] [,26] ## DAX ## RWE ## gold ## oil ## $/\ ## [1] "DAX" "RWE" "gold" "oil" "$/\200" ## pdf ## 2 ######################################################################################################## #step 2: function for efficient Markowitz portfolio (Theorem 3.12) markowitz.portfolio = function(mu.ret, Cov.Matrix=diag(length(mu.ret)), mu.portfolio.min = 0){ if (missing(mu.ret)) stop("need vector of expected asset returns: mu.ret") nr = length(mu.ret) titles= names(mu.ret) if (sum(dim(cov.matrix)==nr)<2) stop("wrong dimensions") ones = rep(1,nr) Cov.inv = solve(cov.matrix) m = length(mu.portfolio.min) xm = matrix(nrow = nr, ncol=m) a = as.numeric(mu.ret%*% Cov.inv %*% mu.ret) b = as.numeric(mu.ret%*% Cov.inv %*% ones ) c = as.numeric(ones %*% Cov.inv %*% ones ) d = a*c-b*b for (k in 1:m){ xm[,k] = a*cov.inv%*%ones- b*cov.inv%*%mu.ret+ mu.portfolio.min[k] *(c*cov.inv%*%mu.ret -b*cov.inv%* } 17

18 } if (length(titles)==0) titles=paste(rep("asset",nr),1:nr) #print(titles) row.names(xm) = titles standarddev = sqrt((mu.portfolio.min^2*c-2*mu.portfolio.min*b+a)/d) return.list = list(xm/d,standarddev) names(return.list) = c("efficient_portfolio","standarddev") return(return.list) (test = markowitz.portfolio(r,c,0.03)) ## $efficient_portfolio ## [,1] ## DAX ## RWE ## gold ## oil ## $/\ ## ## $standarddev ## [1] sum(test$efficient_portfolio) ## [1] 1 (test2 = markowitz.portfolio(r,c,mu)) ## $efficient_portfolio ## [,1] [,2] [,3] [,4] [,5] ## DAX ## RWE ## gold ## oil ## $/\ ## [,6] [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE ## gold ## oil ## $/\ ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## [,22] [,23] [,24] [,25] [,26] 18

19 ## DAX ## RWE ## gold ## oil ## $/\ ## ## $standarddev ## [1] ## [8] ## [15] ## [22] colsums(test2$efficient_portfolio,) ## [1] row.names(test2$efficient_portfolio) ## [1] "DAX" "RWE" "gold" "oil" "$/\200" graph.asset.allocation(portfolio=test2$efficient_portfolio,sd=test2$standarddev, mu=mu, png.name = 'asse ## [,1] [,2] [,3] [,4] [,5] ## DAX ## RWE ## gold ## oil ## $/\ ## [,6] [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE ## gold ## oil ## $/\ ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## [,22] [,23] [,24] [,25] [,26] ## DAX ## RWE ## gold ## oil ## $/\ ## [1] "DAX" "RWE" "gold" "oil" "$/\200" 19

20 x* asset allocation DAX RWE gold oil $/ sd(x*(mu)) mu ## pdf ## 2 ######################################################################################################## #theorem Markowitz with risk free asset - section 3.8, Theorem 3.19 markowitz.portfolio.cash = function(mu.ret, Cov.Matrix=diag(length(mu.ret)), mu.portfolio.min = 0, r0=0) if (missing(mu.ret)) stop("need vector of expected asset returns: mu.ret") titles= names(mu.ret) nr = length(mu.ret) if (sum(dim(cov.matrix)==nr)<2) stop("wrong dimensions") ones = rep(1,nr) Cov.inv = solve(cov.matrix) m = length(mu.portfolio.min) xm.r0 = matrix(nrow = nr+1, ncol=m) #first nr compontens usual assets x^star, nr+1 = cash(r0) x0^star a = as.numeric(mu.ret%*% Cov.inv %*% mu.ret) b = as.numeric(mu.ret%*% Cov.inv %*% ones ) c = as.numeric(ones %*% Cov.inv %*% ones ) d = a-2*b*r0+c*r0*r0 for (k in 1:m){ xm.r0[,k] = c((mu.portfolio.min[k]-r0)*(cov.inv%*%mu.ret - r0 * Cov.inv%*%ones),d-(b-r0*c)*(mu.portf 20

21 } } if (length(titles)==0) titles=paste(rep("asset",nr),1:nr) print(titles) row.names(xm.r0) = c(titles,"cash") standarddev = sqrt(((mu.portfolio.min-r0)^2/d)) return.list = list(xm.r0/d,standarddev) names(return.list) = c("efficient_portfolio","standarddev") return(return.list) r0 = 0.02 mu.new = seq(from=0.0, by=0.01, to=0.84) (portfolio.riskfree = markowitz.portfolio.cash(r,c,mu.new,r0)) ## [1] "DAX" "RWE" "gold" "oil" "$/\200" ## $efficient_portfolio ## [,1] [,2] [,3] [,4] [,5] [,6] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,22] [,23] [,24] [,25] [,26] ## DAX ## RWE ## gold ## oil ## $/\

22 ## cash ## [,27] [,28] [,29] [,30] [,31] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,32] [,33] [,34] [,35] [,36] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,37] [,38] [,39] [,40] [,41] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,42] [,43] [,44] [,45] [,46] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,47] [,48] [,49] [,50] [,51] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,52] [,53] [,54] [,55] [,56] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,57] [,58] [,59] [,60] [,61] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,62] [,63] [,64] [,65] [,66] ## DAX ## RWE ## gold

23 ## oil ## $/\ ## cash ## [,67] [,68] [,69] [,70] [,71] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,72] [,73] [,74] [,75] [,76] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,77] [,78] [,79] [,80] [,81] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,82] [,83] [,84] [,85] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## ## $standarddev ## [1] ## [7] ## [13] ## [19] ## [25] ## [31] ## [37] ## [43] ## [49] ## [55] ## [61] ## [67] ## [73] ## [79] ## [85] colsums(portfolio.riskfree$efficient_portfolio) ## [1] ## [36] ## [71]

24 graph.asset.allocation(portfolio=portfolio.riskfree$efficient_portfolio,sd=portfolio.riskfree$standardde mu=mu.new, png.name = 'asset-allocation-with-cash.png') ## [,1] [,2] [,3] [,4] [,5] [,6] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,22] [,23] [,24] [,25] [,26] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,27] [,28] [,29] [,30] [,31] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,32] [,33] [,34] [,35] [,36] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,37] [,38] [,39] [,40] [,41] ## DAX

25 ## RWE ## gold ## oil ## $/\ ## cash ## [,42] [,43] [,44] [,45] [,46] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,47] [,48] [,49] [,50] [,51] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,52] [,53] [,54] [,55] [,56] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,57] [,58] [,59] [,60] [,61] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,62] [,63] [,64] [,65] [,66] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,67] [,68] [,69] [,70] [,71] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,72] [,73] [,74] [,75] [,76] ## DAX ## RWE ## gold ## oil ## $/\ ## cash

26 ## [,77] [,78] [,79] [,80] [,81] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,82] [,83] [,84] [,85] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [1] "DAX" "RWE" "gold" "oil" "$/\200" "cash" x* asset allocation DAX RWE gold oil $/ cash sd(x*(mu)) mu ## pdf ## 2 # # -> all functions exported to markowitz-functions.r -> including with source("markowitz-functions.r") #### same with unbiased covarince matrix (mw.portfolio = markowitz.portfolio(r,c.unbiased,mu)) ## $efficient_portfolio ## [,1] [,2] [,3] [,4] [,5] 26

27 ## DAX ## RWE ## gold ## oil ## $/\ ## [,6] [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE ## gold ## oil ## $/\ ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## [,22] [,23] [,24] [,25] [,26] ## DAX ## RWE ## gold ## oil ## $/\ ## ## $standarddev ## [1] ## [8] ## [15] ## [22] colsums(mw.portfolio$efficient_portfolio,) ## [1] row.names(mw.portfolio$efficient_portfolio) ## [1] "DAX" "RWE" "gold" "oil" "$/\200" graph.asset.allocation(portfolio=mw.portfolio$efficient_portfolio, sd=mw.portfolio$standarddev, mu=mu, png.name = 'asset-allocation-fig-3-4-c-unbias ## [,1] [,2] [,3] [,4] [,5] ## DAX ## RWE ## gold ## oil ## $/\ ## [,6] [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE

28 ## gold ## oil ## $/\ ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## [,22] [,23] [,24] [,25] [,26] ## DAX ## RWE ## gold ## oil ## $/\ ## [1] "DAX" "RWE" "gold" "oil" "$/\200" x* asset allocation DAX RWE gold oil $/ sd(x*(mu)) mu ## pdf ## 2 28

29 (mw.riskfree = markowitz.portfolio.cash(r,c.unbiased,mu.new,r0)) ## [1] "DAX" "RWE" "gold" "oil" "$/\200" ## $efficient_portfolio ## [,1] [,2] [,3] [,4] [,5] [,6] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,7] [,8] [,9] [,10] [,11] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,12] [,13] [,14] [,15] [,16] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,17] [,18] [,19] [,20] [,21] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,22] [,23] [,24] [,25] [,26] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,27] [,28] [,29] [,30] [,31] ## DAX ## RWE ## gold ## oil ## $/\ ## cash ## [,32] [,33] [,34] [,35] [,36] ## DAX ## RWE ## gold ## oil ## $/\ ## cash

Appendix A Getting Started with R

Appendix A Getting Started with R Appendix A Getting Started with R A.1 Installing R To get started with R, we first have to download and install R on our local system. To get R, go to the Comprehensive R Archive Network (CRAN) website

More information

This report is based on sampled data. Jun 1 Jul 6 Aug 10 Sep 14 Oct 19 Nov 23 Dec 28 Feb 1 Mar 8 Apr 12 May 17 Ju

This report is based on sampled data. Jun 1 Jul 6 Aug 10 Sep 14 Oct 19 Nov 23 Dec 28 Feb 1 Mar 8 Apr 12 May 17 Ju 0 - Total Traffic Content View Query This report is based on sampled data. Jun 1, 2009 - Jun 25, 2010 Comparing to: Site 300 Unique Pageviews 300 150 150 0 0 Jun 1 Jul 6 Aug 10 Sep 14 Oct 19 Nov 23 Dec

More information

Asks for clarification of whether a GOP must communicate to a TOP that a generator is in manual mode (no AVR) during start up or shut down.

Asks for clarification of whether a GOP must communicate to a TOP that a generator is in manual mode (no AVR) during start up or shut down. # Name Duration 1 Project 2011-INT-02 Interpretation of VAR-002 for Constellation Power Gen 185 days Jan Feb Mar Apr May Jun Jul Aug Sep O 2012 2 Start Date for this Plan 0 days 3 A - ASSEMBLE SDT 6 days

More information

software.sci.utah.edu (Select Visitors)

software.sci.utah.edu (Select Visitors) software.sci.utah.edu (Select Visitors) Web Log Analysis Yearly Report 2002 Report Range: 02/01/2002 00:00:0-12/31/2002 23:59:59 www.webtrends.com Table of Contents Top Visitors...3 Top Visitors Over Time...5

More information

Seattle (NWMLS Areas: 140, 380, 385, 390, 700, 701, 705, 710) Summary

Seattle (NWMLS Areas: 140, 380, 385, 390, 700, 701, 705, 710) Summary November, 2016 MTD MARKET UPDATE Data Current Through: November, 2016 (NWMLS Areas: 140, 380, 385, 390,, 701, 705, 710) Summary 4,000 3,500 3,000 2,500 2,000 1,500 1,000 500 0 Active, Pending, & Months

More information

ICT PROFESSIONAL MICROSOFT OFFICE SCHEDULE MIDRAND

ICT PROFESSIONAL MICROSOFT OFFICE SCHEDULE MIDRAND ICT PROFESSIONAL MICROSOFT OFFICE SCHEDULE MIDRAND BYTES PEOPLE SOLUTIONS Bytes Business Park 241 3rd Road Halfway Gardens Midrand Tel: +27 (11) 205-7000 Fax: +27 (11) 205-7110 Email: gauteng.sales@bytes.co.za

More information

pandas: Rich Data Analysis Tools for Quant Finance

pandas: Rich Data Analysis Tools for Quant Finance pandas: Rich Data Analysis Tools for Quant Finance Wes McKinney April 24, 2012, QWAFAFEW Boston about me MIT 07 AQR Capital: 2007-2010 Global Macro and Credit Research WES MCKINNEY pandas: 2008 - Present

More information

Aon Hewitt. Facts & Figures. March 2016 Update. Risk. Reinsurance. Human Resources. Empower Results

Aon Hewitt. Facts & Figures. March 2016 Update. Risk. Reinsurance. Human Resources. Empower Results Aon Hewitt Facts & Figures Risk. Reinsurance. Human Resources. Empower Results Facts & Figures Contents In this document... This button normally prints the whole document. If you want to print just the

More information

Section 1.2: What is a Function? y = 4x

Section 1.2: What is a Function? y = 4x Section 1.2: What is a Function? y = 4x y is the dependent variable because it depends on what x is. x is the independent variable because any value can be chosen to replace x. Domain: a set of values

More information

All King County Summary Report

All King County Summary Report September, 2016 MTD MARKET UPDATE Data Current Through: September, 2016 18,000 16,000 14,000 12,000 10,000 8,000 6,000 4,000 2,000 0 Active, Pending, & Months Supply of Inventory 15,438 14,537 6.6 6.7

More information

Fluidity Trader Historical Data for Ensign Software Playback

Fluidity Trader Historical Data for Ensign Software Playback Fluidity Trader Historical Data for Ensign Software Playback This support document will walk you through the steps of obtaining historical data for esignal into your Ensign Software program so that you

More information

ACTIVE MICROSOFT CERTIFICATIONS:

ACTIVE MICROSOFT CERTIFICATIONS: Last Activity Recorded : August 03, 2017 Microsoft Certification ID : 2069071 JESSE WIMBERLEY 5421 33RD CT SE LACEY, Washington 98503 US jesse.wimberley@gmail.com ACTIVE MICROSOFT CERTIFICATIONS: Microsoft

More information

ADVANCED SPREADSHEET APPLICATIONS (07)

ADVANCED SPREADSHEET APPLICATIONS (07) (07) CONTESTANT ID# START TIME END TIME Financial Services Events Sponsored by the American Institute of Certified Public Accounts TOTAL POINTS (300) Failure to adhere to any of the following rules will

More information

Getting in Gear with the Service Catalog

Getting in Gear with the Service Catalog Getting in Gear with the Service Catalog How an actionable Service Catalog can drive Service Management adoption, improve Customer Satisfaction and provide a Return On Investment......And do it quickly

More information

Seattle (NWMLS Areas: 140, 380, 385, 390, 700, 701, 705, 710) Summary

Seattle (NWMLS Areas: 140, 380, 385, 390, 700, 701, 705, 710) Summary September, 2016 MTD MARKET UPDATE Data Current Through: September, 2016 (NWMLS Areas: 140, 380, 385, 390,, 701, 705, 710) Summary Active, Pending, & Months Supply of Inventory 5,000 4,500 4,000 3,500 4,091

More information

Seattle (NWMLS Areas: 140, 380, 385, 390, 700, 701, 705, 710) Summary

Seattle (NWMLS Areas: 140, 380, 385, 390, 700, 701, 705, 710) Summary October, 2016 MTD MARKET UPDATE Data Current Through: October, 2016 (NWMLS Areas: 140, 380, 385, 390,, 701, 705, 710) Summary Active, Pending, & Months Supply of Inventory 4,500 4,000 3,500 4,197 4,128

More information

Mpoli Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

Mpoli Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Mpoli Archive - FTP Site Statistics Property Value FTP Server ftp.mpoli.fi Description Mpoli Archive Country Finland Scan Date 01/Nov/2015 Total Dirs 52,408 Total Files 311,725 Total Data 28.53 GB Top

More information

Sand Pit Utilization

Sand Pit Utilization Sand Pit Utilization A construction company obtains sand, fine gravel, and coarse gravel from three different sand pits. The pits have different average compositions for the three types of raw materials

More information

COURSE LISTING. Courses Listed. Training for Database & Technology with Modeling in SAP HANA. 20 November 2017 (12:10 GMT) Beginner.

COURSE LISTING. Courses Listed. Training for Database & Technology with Modeling in SAP HANA. 20 November 2017 (12:10 GMT) Beginner. Training for Database & Technology with Modeling in SAP HANA Courses Listed Beginner HA100 - SAP HANA Introduction Advanced HA300 - SAP HANA Certification Exam C_HANAIMP_13 - SAP Certified Application

More information

Yield Reduction Due to Shading:

Yield Reduction Due to Shading: Soap Factory, 111 Gallowgate, Aberdeen, AB5 1 B U 07768 30451/014 9 0 0 8 7 8 3x0 00 x x JT50SCc 50 W TRIO-0,0-TL-OUT x0 3x0 x TRIO-0,0-TL-OUT 3; 1 0.0kW 00 x x JT50SCc 50 W TRIO-0,0-TL-OUT 0.0kW 00 x

More information

AIMMS Function Reference - Date Time Related Identifiers

AIMMS Function Reference - Date Time Related Identifiers AIMMS Function Reference - Date Time Related Identifiers This file contains only one chapter of the book. For a free download of the complete book in pdf format, please visit www.aimms.com Aimms 3.13 Date-Time

More information

SCI - software.sci.utah.edu (Select Visitors)

SCI - software.sci.utah.edu (Select Visitors) SCI - software.sci.utah.edu (Select Visitors) Web Log Analysis Yearly Report 2004 Report Range: 01/01/2004 00:00:00-12/31/2004 23:59:59 www.webtrends.com Table of Contents Top Visitors...3 Top Visitors

More information

Bernt Arne Ødegaard. 15 November 2018

Bernt Arne Ødegaard. 15 November 2018 R Bernt Arne Ødegaard 15 November 2018 To R is Human 1 R R is a computing environment specially made for doing statistics/econometrics. It is becoming the standard for advanced dealing with empirical data,

More information

2

2 May 2016 1 2 3 4 5 A. Consumer Confidence Index (CCI) - Consumer Confidence Index (CCI) - Current Economic Condition Index (CECI) - Consumer Expectation Index (CEI) Current Economic Condition Index - Current

More information

HPE Security Data Security. HPE SecureData. Product Lifecycle Status. End of Support Dates. Date: April 20, 2017 Version:

HPE Security Data Security. HPE SecureData. Product Lifecycle Status. End of Support Dates. Date: April 20, 2017 Version: HPE Security Data Security HPE SecureData Product Lifecycle Status End of Support Dates Date: April 20, 2017 Version: 1704-1 Table of Contents Table of Contents... 2 Introduction... 3 HPE SecureData Appliance...

More information

UAE PUBLIC TRAINING CALENDAR

UAE PUBLIC TRAINING CALENDAR UAE 102-R8.3 Primavera P6 Professional Fundamentals Rel 8.3 5 Abu Dhabi 4-Jan 8-Jan 19.5 106-R8.3 Primavera P6 Professional Advanced Rel8.3 3 Dubai 18-Jan 20-Jan 13.0 PMI-SP01 SP) Certification) 5 Abu

More information

Some issues with R It is command-driven, and learning to use it to its full extent takes some time and effort. The documentation is comprehensive,

Some issues with R It is command-driven, and learning to use it to its full extent takes some time and effort. The documentation is comprehensive, R To R is Human R is a computing environment specially made for doing statistics/econometrics. It is becoming the standard for advanced dealing with empirical data, also in finance. Good parts It is freely

More information

2

2 March 2016 1 2 3 4 5 A. Consumer Confidence Index (CCI) - Consumer Confidence Index (CCI) - Current Economic Condition Index (CECI) - Consumer Expectation Index (CEI) Current Economic Condition Index -

More information

2

2 February 2015 1 2 3 4 5 A. Consumer Confidence Index (CCI) - Consumer Confidence Index (CCI) - Current Economic Condition Index (CECI) - Consumer Expectation Index (CEI) Current Economic Condition Index

More information

Monthly SEO Report. Example Client 16 November 2012 Scott Lawson. Date. Prepared by

Monthly SEO Report. Example Client 16 November 2012 Scott Lawson. Date. Prepared by Date Monthly SEO Report Prepared by Example Client 16 November 212 Scott Lawson Contents Thanks for using TrackPal s automated SEO and Analytics reporting template. Below is a brief explanation of the

More information

Lecture 10: Boolean Expressions

Lecture 10: Boolean Expressions Lecture 10: Boolean Expressions CS1068+ Introductory Programming in Python Dr Kieran T. Herley Department of Computer Science University College Cork 2017-2018 KH (12/10/17) Lecture 10: Boolean Expressions

More information

New Concept for Article 36 Networking and Management of the List

New Concept for Article 36 Networking and Management of the List New Concept for Article 36 Networking and Management of the List Kerstin Gross-Helmert, AFSCO 28 th Meeting of the Focal Point Network EFSA, MTG SEAT 00/M08-09 THE PRESENTATION Why a new concept? What

More information

COURSE LISTING. Courses Listed. with SAP Hybris Marketing Cloud. 24 January 2018 (23:53 GMT) HY760 - SAP Hybris Marketing Cloud

COURSE LISTING. Courses Listed. with SAP Hybris Marketing Cloud. 24 January 2018 (23:53 GMT) HY760 - SAP Hybris Marketing Cloud with SAP Hybris Marketing Cloud Courses Listed HY760 - SAP Hybris Marketing Cloud C_HYMC_1702 - SAP Certified Technology Associate - SAP Hybris Marketing Cloud (1702) Implementation Page 1 of 12 All available

More information

ACTIVE MICROSOFT CERTIFICATIONS:

ACTIVE MICROSOFT CERTIFICATIONS: Last Activity Recorded : July 20, 2017 Microsoft Certification ID : 2665612 MARC GROTE Wittorfer Strasse 4 Bardowick, Lower Saxony 21357 DE marc.grote@it-consulting-grote.de ACTIVE MICROSOFT CERTIFICATIONS:

More information

Excel Functions & Tables

Excel Functions & Tables Excel Functions & Tables SPRING 2016 Spring 2016 CS130 - EXCEL FUNCTIONS & TABLES 1 Review of Functions Quick Mathematics Review As it turns out, some of the most important mathematics for this course

More information

Tracking the Internet s BGP Table

Tracking the Internet s BGP Table Tracking the Internet s BGP Table Geoff Huston Telstra December 2000 Methodology! The BGP table monitor uses a router at the boundary of AS1221 which has a default-free ebgp routing table 1. Capture the

More information

3. EXCEL FORMULAS & TABLES

3. EXCEL FORMULAS & TABLES Winter 2019 CS130 - Excel Formulas & Tables 1 3. EXCEL FORMULAS & TABLES Winter 2019 Winter 2019 CS130 - Excel Formulas & Tables 2 Cell References Absolute reference - refer to cells by their fixed position.

More information

Birthdates by Species 12,064. Beef Bison Dairy Sheep. Birthdates by Year

Birthdates by Species 12,064. Beef Bison Dairy Sheep. Birthdates by Year As of December 31, 211 Birthdates in Database 14,465,862 Birthdates by Species 14,, 12,, 12,49,439 1,, 8,, 6,, 4,, 2,, 2,43,732 12,64 627 Beef Bison Dairy Sheep Birthdates by Year 3,, 2,5, 2,, Beef Dairy

More information

Customer Forum. Access to Data. Author, Department. 26 April 2018

Customer Forum. Access to Data. Author, Department. 26 April 2018 Customer Forum Access to Data Author, Department 26 April 2018 Context Today, more data is being generated, with more interest in it, and more applications for it AusNet Services aims to be a provider

More information

2014 Flow-Through Limited Partnerships

2014 Flow-Through Limited Partnerships 2014 Flow-Through Limited Partnerships 2014 FTLPs Sprott Flow Through LP II Oct 2014 $20.0 $25.00 $19.77 79.1% 30 Nov 14 CMP Resource LP Feb 2014 $31.9 $1,000.00 $661.74 66.2% 30 Nov 14 Front Street Flow

More information

Martin Purvis CEO. Presentation following the AGM. 26 April 2012

Martin Purvis CEO. Presentation following the AGM. 26 April 2012 Martin Purvis CEO Presentation following the AGM 26 April 212 IMPORTANT NOTICE Nothing in this presentation constitutes an offer of securities for sale. This presentation contains certain forward-looking

More information

Annex A to the DVD-R Disc and DVD-RW Disc Patent License Agreement Essential Sony Patents relevant to DVD-RW Disc

Annex A to the DVD-R Disc and DVD-RW Disc Patent License Agreement Essential Sony Patents relevant to DVD-RW Disc Annex A to the DVD-R Disc and DVD-RW Disc Patent License Agreement Essential Sony Patents relevant to DVD-RW Disc AT-EP S95P0391 1103087.1 09-Feb-01 1126619 8/16 Modulation AT-EP S95P0391 1120568.9 29-Aug-01

More information

Quatius Corporation - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

Quatius Corporation - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Property Value FTP Server ftp.quatius.com.au Description Quatius Corporation Country Australia Scan Date 03/Sep/2015 Total Dirs 133 Total Files 771 Total Data 9.61 GB Top 20 Directories Sorted by Disk

More information

Optimizing Field Operations. Jeff Shaner

Optimizing Field Operations. Jeff Shaner Optimizing Field Operations Jeff Shaner Field GIS Taking GIS Beyond the Office Collecting Data Reporting Observations Managing Work Connecting the Field with the Enterprise Workforce for ArcGIS Field workforce

More information

Polycom Advantage Service Endpoint Utilization Report

Polycom Advantage Service Endpoint Utilization Report Polycom Advantage Service Endpoint Utilization Report ABC Company 9/1/2018-9/30/2018 Polycom, Inc. All rights reserved. SAMPLE REPORT d This report is for demonstration purposes only. Any resemblance to

More information

Billing and Collection Agent Report For period ending January 31, To FCC Contract Oversight Sub-Committee. February 11, 2019

Billing and Collection Agent Report For period ending January 31, To FCC Contract Oversight Sub-Committee. February 11, 2019 Billing and Collection Agent Report For period ending January 31, 2019 To FCC Contract Oversight Sub-Committee February 11, 2019 Welch LLP - Chartered Professional Accountants 123 Slater Street, 3 rd floor,

More information

CIMA Asia. Interactive Timetable Live Online

CIMA Asia. Interactive Timetable Live Online CIMA Asia Interactive Timetable 2017 2018 Live Online Version 1 Information last updated 09 October 2017 Please note: Information and dates in this timetable are subject to change. CIMA Cert BA Course

More information

Polycom Advantage Service Endpoint Utilization Report

Polycom Advantage Service Endpoint Utilization Report Polycom Advantage Service Endpoint Utilization Report ABC Company 3/1/2016-3/31/2016 Polycom, Inc. All rights reserved. SAMPLE REPORT d This report is for demonstration purposes only. Any resemblance to

More information

ADVALO TRAINING SCHEDULE FOR THE YEAR Exadata Database Machine: 12c Administration Workshop Ed 1

ADVALO TRAINING SCHEDULE FOR THE YEAR Exadata Database Machine: 12c Administration Workshop Ed 1 ADVALO TRAINING SCHEDULE FOR THE YEAR 2017 STARTDATE DURATION COURSE NAME 22-Jan-17 22-Jan-17 29-Jan-17 29-Jan-17 29-Jan-17 5-Feb-17 5-Feb-17 5-Feb-17 19-Feb-17 19-Feb-17 19-Feb-17 5 Exadata Database Machine:

More information

ERS IT Portfolio Report

ERS IT Portfolio Report Administration and Operations Committee ERS IT Portfolio Report January 21 st, 2014 1 Agenda Information Technology Projects Summary 2013 End of Year Metrics Project Management Office CMERS Website Applications

More information

DAS LRS Monthly Service Report

DAS LRS Monthly Service Report DAS LRS Monthly Service Report Customer Service Manager : Diploma Aggregation Service : Daniel Ward Project/document reference : DAS LRS 2010-12 Issue : 1.0 Issue date : 17 th January 2011 Reporting Period

More information

BANGLADESH UNIVERSITY OF PROFESSIONALS ACADEMIC CALENDAR FOR MPhil AND PHD PROGRAM 2014 (4 TH BATCH) PART I (COURSE WORK)

BANGLADESH UNIVERSITY OF PROFESSIONALS ACADEMIC CALENDAR FOR MPhil AND PHD PROGRAM 2014 (4 TH BATCH) PART I (COURSE WORK) BANGLADESH UNIVERSITY OF PROFESSIONALS ACADEMIC CALENDAR FOR MPhil AND PHD PROGRAM 2014 (4 TH BATCH) DAY Soci-Economic and Political History of Bangladesh PART I (COURSE WORK) 1 ST SEMESTER 2 ND SEMESTER

More information

EECS2301. Example. Testing 3/22/2017. Linux/Unix Part 3. for SCRIPT in /path/to/scripts/dir/* do if [ -f $SCRIPT -a -x $SCRIPT ] then $SCRIPT fi done

EECS2301. Example. Testing 3/22/2017. Linux/Unix Part 3. for SCRIPT in /path/to/scripts/dir/* do if [ -f $SCRIPT -a -x $SCRIPT ] then $SCRIPT fi done Warning: These notes are not complete, it is a Skelton that will be modified/add-to in the class. If you want to us them for studying, either attend the class or get the completed notes from someone who

More information

AVM Networks - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

AVM Networks - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Property Value FTP Server ftp.avm.de Description AVM Networks Country Germany Scan Date 12/May/2014 Total Dirs 2,056 Total Files 2,698 Total Data 39.66 GB Top 20 Directories Sorted by Disk Space Name Dirs

More information

Eindhoven University of Technology - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

Eindhoven University of Technology - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Eindhoven University of Technology - FTP Site Statistics Property Value FTP Server ftp.tue.nl Description Eindhoven University of Technology Country Netherlands Scan Date 10/May/2014 Total Dirs 129 Total

More information

Technical University of Munich - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

Technical University of Munich - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Technical University of Munich - FTP Site Statistics Property Value FTP Server ftp.ldv.e-technik.tu-muenchen.de Description Technical University of Munich Country Germany Scan Date 23/May/2014 Total Dirs

More information

CORPORATE PRESENTATION 2014

CORPORATE PRESENTATION 2014 CORPORATE PRESENTATION 2014 ABOUT DIGITAL GAMING Digital gaming is everywhere Smartphones & Tablets Feature phones TVs & STBs Smartphones, tablets, smart TVs, STBs, smart watches Installed base of 2 billion

More information

Omega Engineering Software Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

Omega Engineering Software Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Omega Engineering Software Archive - FTP Site Statistics Property Value FTP Server ftp.omega.com Description Omega Engineering Software Archive Country United States Scan Date 14/Apr/2015 Total Dirs 460

More information

San Francisco Housing Authority (SFHA) Leased Housing Programs October 2015

San Francisco Housing Authority (SFHA) Leased Housing Programs October 2015 San Francisco Housing Authority (SFHA) Leased Housing Programs October 2015 Table of Contents Program Utilization Summary 3 PIC Reporting Rate 4-5 Operational Updates Recertifications and Inspections 6-7

More information

Decision Making Information from Your Mobile Device with Today's Rockwell Software

Decision Making Information from Your Mobile Device with Today's Rockwell Software Decision Making Information from Your Mobile Device with Today's Rockwell Software PUBLIC Rockwell Automation TechED 2016 @ROKTechED #ROKTechED Copyright 2016 Rockwell Automation, Inc. All Rights Reserved.

More information

National Aeronautics and Space Admin. - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

National Aeronautics and Space Admin. - FTP Site Statistics. Top 20 Directories Sorted by Disk Space National Aeronautics and Space Admin. - FTP Site Statistics Property Value FTP Server ftp.hq.nasa.gov Description National Aeronautics and Space Admin. Country United States Scan Date 26/Apr/2014 Total

More information

INTERTANKO Vetting seminar 24 th October 2017

INTERTANKO Vetting seminar 24 th October 2017 INTERTANKO Vetting seminar 24 th October 2017 SIRE Developments VIQ 7 New VIQ being developed Structure will remain the same with 13 chapters. Reduction in the number of questions, net approx. 70 decrease.

More information

e-sens Nordic & Baltic Area Meeting Stockholm April 23rd 2013

e-sens Nordic & Baltic Area Meeting Stockholm April 23rd 2013 e-sens Nordic & Baltic Area Meeting Stockholm April 23rd 2013 Objectives of the afternoon parallel tracks sessions 2 Meeting objectives High level: Identification of shared interests with emphasis on those

More information

Piper Jaffray Europe Conference London

Piper Jaffray Europe Conference London Piper Jaffray Europe Conference London Franki D Hoore Director Investor Relations June 22, 2010 / Slide 1 Safe Harbor "Safe Harbor" Statement under the US Private Securities Litigation Reform Act of 1995:

More information

ISE Cyber Security UCITS Index (HUR)

ISE Cyber Security UCITS Index (HUR) ISE Cyber Security UCITS Index (HUR) Why Cybersecurity is important Data breaches have become almost commonplace in the last few years Cybersecurity focuses on protecting computers, networks, programs,

More information

AAT Malaysia. Interactive Timetable / 2017 Live Online

AAT Malaysia. Interactive Timetable / 2017 Live Online AAT Malaysia Interactive Timetable 2016 / Live Online AWARDS 2016 Winner Information last updated 10/10/16 version 3 Please note information and dates are subject to change Kaplan Live Online Information

More information

NCC Cable System Order

NCC Cable System Order Syscode 0081 Agency Beacon Media System Name Spectrum/Park Cities, TX Advertiser Ed Meier for Congress $2,421.00 Commission $363.15 Net $2,057.85 198 1 AEN VARIOUS 2/26/18 3/4/18 19:00 24:00 X X X X X

More information

NMOSE GPCD CALCULATOR

NMOSE GPCD CALCULATOR NMOSE CALCULATOR It should be noted that all the recorded data should be from actual metered results and should not include any estimates. Gallons per Capita - v2.4 Beta Release Date: Mar, 16, 29 This

More information

Sony Ericsson continues to invest for future growth

Sony Ericsson continues to invest for future growth PRESS RELEASE April 23, 2008 Sony Ericsson continues to invest for future growth Q1 Highlights: Year-on-year volume growth of 2% Income before taxes at higher end of forecast R&D investment continues to

More information

App Economy Market analysis for Economic Development

App Economy Market analysis for Economic Development App Economy Market analysis for Economic Development Mustapha Hamza, ISET Com Director mustapha.hamza@isetcom.tn ITU Arab Forum on Future Networks: "Broadband Networks in the Era of App Economy", Tunis

More information

San Joaquin County Emergency Medical Services Agency

San Joaquin County Emergency Medical Services Agency San Joaquin County Emergency Medical Services Agency http://www.sjgov.org/ems Memorandum TO: All Interested Parties FROM: Rick Jones, EMS Analyst DATE: January, 19 Mailing Address PO Box French Camp, CA

More information

CIMA Asia. Interactive Timetable Live Online

CIMA Asia. Interactive Timetable Live Online CIMA Asia Interactive Timetable 2018 Live Online Information version 8 last updated 04/05/18 Please note information and dates are subject to change. Premium Learning Partner 2018 CIMA Cert BA Course Overview

More information

University of Rochester - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

University of Rochester - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Property Value FTP Server ftp.cs.rochester.edu Description University of Rochester Country United States Scan Date 02/Sep/2015 Total Dirs 204 Total Files 2,949 Total Data 20.85 GB Top 20 Directories Sorted

More information

MUC Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

MUC Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space MUC Archive - FTP Site Statistics Property Value FTP Server ftp.muc.de Description MUC Archive Country Germany Scan Date 16/Nov/2015 Total Dirs 237 Total Files 1,033 Total Data 839.68 MB Top 20 Directories

More information

COURSE LISTING. Courses Listed. Training for Database & Technology with Modeling in SAP HANA. Last updated on: 30 Nov 2018.

COURSE LISTING. Courses Listed. Training for Database & Technology with Modeling in SAP HANA. Last updated on: 30 Nov 2018. Training for Database & Technology with Modeling in SAP HANA Courses Listed Einsteiger HA100 - SAP HANA Introduction Fortgeschrittene HA300 - SAP HANA 2.0 SPS03 Modeling HA301 - SAP HANA 2.0 SPS02 Advanced

More information

University of California - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

University of California - FTP Site Statistics. Top 20 Directories Sorted by Disk Space Property Value FTP Server ftp.icsi.berkeley.edu Description University of California Country United States Scan Date 15/Jun/2015 Total Dirs 591 Total Files 12,510 Total Data 10.83 GB Top 20 Directories

More information

The CPA Exam and Requirements. Adapted and modified from material originally created by David Reinus.

The CPA Exam and Requirements. Adapted and modified from material originally created by David Reinus. The CPA Exam and Requirements Adapted and modified from material originally created by David Reinus. An extra $1,024,870 with a CPA license. Education Exam Experience Every state is unique Step 5 Step

More information

HIGH RISK REPORT J.CREW GROUP, INC. September 14, 2017

HIGH RISK REPORT J.CREW GROUP, INC. September 14, 2017 HIGH RISK REPORT J.CREW GROUP, INC. September 14, 2017 CreditRiskMonitor s assessment of J.Crew Group, Inc. s ( JCG ) high risk status has been determined by a combination of factors: Monthly Average FRISK

More information

AAT Asia. Interactive Timetable / 2019 Live Online AWARDS Winner

AAT Asia. Interactive Timetable / 2019 Live Online AWARDS Winner AAT Asia Interactive Timetable / 2019 Live Online Information last updated 02/02/ version 1 Please note information and dates are subject to change. AWARDS 2017 Winner Kaplan Live Online Information Malaysia

More information

Annex A to the MPEG Audio Patent License Agreement Essential Philips, France Telecom and IRT Patents relevant to DVD-Video Disc - MPEG Audio - general

Annex A to the MPEG Audio Patent License Agreement Essential Philips, France Telecom and IRT Patents relevant to DVD-Video Disc - MPEG Audio - general Essential Philips, France Telecom and IRT Patents relevant to DVD-Video Disc - MPEG Audio - general PUBLICATION AR N 013241-317015 04-Jun-90 11-Oct-96 250211 11-Oct-11 Universal subband coder format AT

More information

MSRS Roadmap. As of January 15, PJM 2019

MSRS Roadmap. As of January 15, PJM 2019 MSRS Roadmap As of January 15, 2019 Impact Details Product - Action Required Deadline Who May Be Affected MSRS - Update processes to use basic authentication MSRS - Org parameter added for SUMA requests

More information

APPENDIX E2 ADMINISTRATIVE DATA RECORD #2

APPENDIX E2 ADMINISTRATIVE DATA RECORD #2 APPENDIX E2 ADMINISTRATIVE DATA RECORD #2 Position (s} Document Identifier 1-3 PAB, PBB, or PEB PIIN 4-16 SPIIN 17-22 Must agree with the related P,_A Discount Terms 23-37 May be blank in the PBB an&peb

More information

HIGHCHARTS - QUICK GUIDE HIGHCHARTS - OVERVIEW

HIGHCHARTS - QUICK GUIDE HIGHCHARTS - OVERVIEW HIGHCHARTS - QUICK GUIDE http://www.tutorialspoint.com/highcharts/highcharts_quick_guide.htm Copyright tutorialspoint.com HIGHCHARTS - OVERVIEW Highcharts is a pure JavaScript based charting library meant

More information

The Other Packages Gallery

The Other Packages Gallery The Other Packages Gallery David J. Scott February 2, 2016 Contents 1 Introduction 2 2 The packages spdep, splm, and sphet 2 2.1 The package spdep.................................. 2 2.2 The package splm...................................

More information

More Binary Search Trees AVL Trees. CS300 Data Structures (Fall 2013)

More Binary Search Trees AVL Trees. CS300 Data Structures (Fall 2013) More Binary Search Trees AVL Trees bstdelete if (key not found) return else if (either subtree is empty) { delete the node replacing the parents link with the ptr to the nonempty subtree or NULL if both

More information

Imputation for missing observation through Artificial Intelligence. A Heuristic & Machine Learning approach

Imputation for missing observation through Artificial Intelligence. A Heuristic & Machine Learning approach Imputation for missing observation through Artificial Intelligence A Heuristic & Machine Learning approach (Test case with macroeconomic time series from the BIS Data Bank) Byeungchun Kwon Bank for International

More information

Markets Gateway Roadmap

Markets Gateway Roadmap Markets Gateway Roadmap As of April 17, 2018 www.pjm.com Background Markets Gateway allows users to submit information and obtain data needed to conduct business in the Day-Ahead, Regulation and Synchronized

More information

GWDG Software Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

GWDG Software Archive - FTP Site Statistics. Top 20 Directories Sorted by Disk Space GWDG Software Archive - FTP Site Statistics Property Value FTP Server ftp5.gwdg.de Description GWDG Software Archive Country Germany Scan Date 18/Jan/2016 Total Dirs 1,068,408 Total Files 30,248,505 Total

More information

Midwest ISO Overview - ATC Customer Meeting. February 26, 2009

Midwest ISO Overview - ATC Customer Meeting. February 26, 2009 Midwest ISO Overview - ATC Customer Meeting February 26, 2009 Agenda Overview January 2009 Dashboard Module E RAR Timeline Questions 2 Overview January was characterized by seasonal cold temperatures,

More information

XS4ALL Networks - FTP Site Statistics. Top 20 Directories Sorted by Disk Space

XS4ALL Networks - FTP Site Statistics. Top 20 Directories Sorted by Disk Space XS4ALL Networks - FTP Site Statistics Property Value FTP Server ftp.xs4all.nl Description XS4ALL Networks Country Netherlands Scan Date 11/May/2014 Total Dirs 181 Total Files 877 Total Data 2.63 GB Top

More information

More BSTs & AVL Trees bstdelete

More BSTs & AVL Trees bstdelete More BSTs & AVL Trees bstdelete if (key not found) return else if (either subtree is empty) { delete the node replacing the parents link with the ptr to the nonempty subtree or NULL if both subtrees are

More information

CMR India Monthly Mobile Handset Market Report. June 2017

CMR India Monthly Mobile Handset Market Report. June 2017 CMR India Monthly Mobile Handset Market Report June 2017 Cyber Media Research Ltd. www.cmrindia.com Submitted by: Copyright 1 Copyright 2017 Cyber 2017 Cyber Media Media Research Research Ltd. Reproduction

More information

Grade 4 Mathematics Pacing Guide

Grade 4 Mathematics Pacing Guide Jul 2014 ~ August 2014 ~ Sep 2014 1 2 3 4 5 6 7 8 9 10 11 12 14 15 16 17 Routines 19 Routines 20 Routines BOY 22 BOY 23 24 11 12 14 29 15 30 31 Notes: Found Online @ wwweverydaymathonlinecom 1 More Calendars

More information

REPORT ON TELECOMMUNICATIONS SERVICE QUALITY WINDSTREAM FLORIDA, INC.

REPORT ON TELECOMMUNICATIONS SERVICE QUALITY WINDSTREAM FLORIDA, INC. REPORT ON TELECOMMUNICATIONS SERVICE QUALITY For WINDSTREAM FLORIDA, INC. Alachua, Brooker, High Springs, Melrose, and Waldo s February 4 March 14, 2008 Division of Service, Safety & Consumer Assistance

More information

Kaufman Brothers 13 th Annual Investor Conference

Kaufman Brothers 13 th Annual Investor Conference Kaufman Brothers 13 th Annual Investor Conference Craig DeYoung, VP Investor Relations New York, New York September 14, 21 / Slide 1 Safe Harbor "Safe Harbor" Statement under the US Private Securities

More information

COURSE LISTING. Courses Listed. with Governance, Risk and Compliance (GRC) SAP BusinessObjects. 19 February 2018 (15:13 GMT) GRC100 -

COURSE LISTING. Courses Listed. with Governance, Risk and Compliance (GRC) SAP BusinessObjects. 19 February 2018 (15:13 GMT) GRC100 - with Governance, Risk and Compliance (GRC) SAP BusinessObjects Courses Listed GRC100 - GRC300-10.0 C_GRCAC_10 - SAP Certified Application Associate - SAP BusinessObjects Access Control 10.0 Page 1 of 12

More information

How to use Chart from Table macro

How to use Chart from Table macro How to use Chart from Table macro Managing Dynamic Charts from Table Data Table Filter for Confluence add-on allows you to visualize your table data and create dynamic charts that you can configure and

More information

Operational Overview. Interesting Day Overview: February 2013

Operational Overview. Interesting Day Overview: February 2013 Operational Overview Interesting Day Overview: February 213 Interesting Day Overview High PCLP SMPB ( ) Bacton ASEP Scaleback w/c Dec 31st Jan 7th Jan 14th Jan 21st Jan 28th Feb 4th Exit Constraint Exit

More information

Technical Manual Index

Technical Manual Index Technical Manual Index Manuals January 1, 2018 Publication Number CFMI-TP. Nomenclature Version Next CD.512-2A Shop Manual SM.6 R83 Illustrated Parts Catalog PC.9 R63 Service Bulletins Up to Nov 1,2017

More information

Access Control and Physical Security Management. Contents are subject to change. For the latest updates visit

Access Control and Physical Security Management. Contents are subject to change. For the latest updates visit Access Control and Physical Security Management Page 1 of 6 Why Attend Today s security landscape requires individuals and businesses to take the threat to safety and security seriously. Safe and secure

More information