[Vinecopula-commits] r98 - / pkg/R pkg/man
    noreply at r-forge.r-project.org 
    noreply at r-forge.r-project.org
                  
    Do Mai 28 15:37:52 CEST 2015
    
    
Author: etobi
Date: 2015-05-28 15:37:47 +0200 (Thu, 28 May 2015)
New Revision: 98
Modified:
   pkg.pdf
   pkg/R/pairs.R
   pkg/man/BB8Copula.Rd
   pkg/man/BiCopLambda.Rd
   pkg/man/RVineGofTest.Rd
   pkg/man/RVinePIT.Rd
   pkg/man/VineCopula-package.Rd
   pkg/man/pairs.copuladata.Rd
Log:
some cosmetics and revision of pairs
Modified: pkg/R/pairs.R
===================================================================
--- pkg/R/pairs.R	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg/R/pairs.R	2015-05-28 13:37:47 UTC (rev 98)
@@ -6,44 +6,84 @@
                              diag.panel = dp.copuladata,
                              label.pos = 0.85, 
                              cex.labels = 1,
-                             gap = 0) {
+                             gap = 0,
+                             method = "kendall",
+                             ccols = terrain.colors(30),
+                             margins = "norm",
+                             margins.par = 0) {
   ## pairs plot for 'copuladata'
   
-  # provide input data and set default labels, panel functions, etc.
-  default <- list(x = as.matrix(x),
-                  labels = labels,
-                  lower.panel = lower.panel,
-                  upper.panel = upper.panel,
-                  diag.panel = diag.panel,
-                  label.pos = label.pos, 
-                  cex.labels = cex.labels,
-                  gap = gap
-                  )
+  # panel functions
+  if (!is.null(lower.panel) && missing(lower.panel)) {
+    lp <- function(x, y, cc = ccols, mar = margins, marpar = margins.par, ...) {
+      lower.panel(x, y, cc = cc, mar = mar, marpar = marpar, ...)
+    }
+  } else {
+    lp <- lower.panel
+  }
+  if (!is.null(upper.panel) && missing(upper.panel)) {
+    up <- function(x, y, mthd = method, ...) {
+      upper.panel(x, y, mthd = mthd, ...)
+    }
+  } else {
+    up <- upper.panel
+  }
+  if (!is.null(diag.panel) && missing(diag.panel)) {
+    dp <- function(x, ...) {
+      diag.panel(x, ...)
+    }
+  } else {
+    dp <- diag.panel
+  }
   
   # pairs plot (with panel functions as defined below or as provided by user)
-  pars <- modifyList(list(xaxt = "n", yaxt = "n"), list(...))
-  op <- do.call(par, pars)
-  do.call(pairs, modifyList(default, list(...)))
+  op <- par(xaxt = "n", yaxt = "n")
+  #do.call(pairs, modifyList(default, list(...)))
+  pairs(x = as.matrix(x),
+        labels = labels,
+        ...,
+        lower.panel = lp,
+        upper.panel = up,
+        diag.panel = dp,
+        label.pos = label.pos, 
+        cex.labels = cex.labels,
+        gap = gap)
   on.exit(par(op))
 }
 
 
 ## lower panel: empirical contour plot
-lp.copuladata <- function(x, y, ...) {
+lp.copuladata <- function(x, y, cc, mar, marpar, ...) {
+  # set number of levels and if contour labels are drawn
+  if (length(cc) == 1) {
+    nlvls <- 11
+    dl <- TRUE
+  } else {
+    nlvls <- length(cc)
+    dl <- FALSE
+  }
+  # set levels according to margins
+  if (mar %in% c("norm", "t", "exp")) {
+    lvls <- seq(0.0, 0.2, length.out = nlvls)
+  } else if (mar == "gamma") {
+    lvls <- seq(0.0, 0.1, length.out = nlvls)
+  } else if (mar == "unif") {
+    lvls <- seq(0.1, 1.5, length.out = nlvls)
+  }
   # set default parameters
   pars <- list(u1 = x,
                u2 = y,
                bw = 2, 
                size = 100, 
-               levels = seq(0.01, 0.2, length.out = 30),
-               margins = "norm", 
-               margins.par = 0, 
-               xylim = NA, 
-               col = terrain.colors(30),
+               levels = lvls,
+               margins = mar, 
+               margins.par = marpar, 
+               xylim = NA,
                axes = FALSE,
-               drawlabels = FALSE)
+               drawlabels = dl)
   # get non-default parameters
   pars <- modifyList(pars, list(...))
+  pars <- modifyList(modifyList(pars, list(col = NULL)), list(col = cc))
   op <- par(usr = c(-3, 3, -3, 3), new = TRUE)
   # call BiCopMetaContour
   do.call(BiCopMetaContour, pars)
@@ -52,7 +92,7 @@
 
 
 ## upper panel: scatter plot (copula data) and correlation
-up.copuladata <- function(x, y, ...) {
+up.copuladata <- function(x, y, mthd, ...) {
   # set default parameters
   pars <- list(x = x,
                y = y,
@@ -65,17 +105,14 @@
   op <- par(usr = c(0, 1, 0, 1), new = TRUE)
   # call points (to produce scatter plot)
   do.call(points, pars)
-  r <- cor(x = x, y = y, method = "kendall")
+  r <- cor(x = x, y = y, method = mthd)
   txt <- format(x = r, digits = 2, nsmall = 2)[1]
   # call text
-  do.call(text, modifyList(list(x = 0.5,
-                                y = 0.5,
-                                labels = txt,
-                                cex = 1 + abs(r) * 3,
-                                col = "red"),
-                           list(...)
-                           )
-  )
+  pars.txt <- list(x = 0.5,
+                   y = 0.5,
+                   labels = txt)
+  pars.txt <- modifyList(pars.txt, list(...))
+  do.call(text, modifyList(pars.txt, list(cex = 1 + abs(r) * 3, col = "red")))
   on.exit(par(op))
 }
 
@@ -86,14 +123,14 @@
   pars <- list(x = x,
                freq = FALSE,
                add = TRUE,
-               col = "grey",
-               border = "black", 
+               border = "white", 
                main = "")
   # get non-default parameters
-  pars <- modifyList(pars, list(...))
+  pars <- modifyList(modifyList(pars, list(...)), list(col = "grey"))
   op <- par(usr = c(0, 1, 0, 1.6), new = TRUE)
   # call hist
   do.call(hist, pars)
+  box()
   if (pars$freq == FALSE)
     abline(h = 1, col = "black", lty = 3)
   on.exit(par(op))
Modified: pkg/man/BB8Copula.Rd
===================================================================
--- pkg/man/BB8Copula.Rd	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg/man/BB8Copula.Rd	2015-05-28 13:37:47 UTC (rev 98)
@@ -37,8 +37,8 @@
 \examples{
 library(copula)
 
-persp(BB8Copula(c(1,0.5)), dCopula, zlim = c(0,10))
-persp(surBB8Copula(c(1,0.5)), dCopula, zlim = c(0,10))
-persp(r90BB8Copula(c(-1,-0.5)), dCopula, zlim = c(0,10))
-persp(r270BB8Copula(c(-1,-0.5)), dCopula, zlim = c(0,10))
+persp(BB8Copula(c(2,0.9)), dCopula, zlim = c(0,10))
+persp(surBB8Copula(c(2,0.9)), dCopula, zlim = c(0,10))
+persp(r90BB8Copula(c(-2,-0.9)), dCopula, zlim = c(0,10))
+persp(r270BB8Copula(c(-2,-0.9)), dCopula, zlim = c(0,10))
 }
\ No newline at end of file
Modified: pkg/man/BiCopLambda.Rd
===================================================================
--- pkg/man/BiCopLambda.Rd	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg/man/BiCopLambda.Rd	2015-05-28 13:37:47 UTC (rev 98)
@@ -111,6 +111,7 @@
 
 # lambda-function of estimated copula
 fit <- BiCopSelect(dat[, 1], dat[, 2])
+par(mfrow = c(1, 1))
 BiCopLambda(fit)
 
 # simulate from rotated Clayton copula (90 degrees)
Modified: pkg/man/RVineGofTest.Rd
===================================================================
--- pkg/man/RVineGofTest.Rd	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg/man/RVineGofTest.Rd	2015-05-28 13:37:47 UTC (rev 98)
@@ -154,9 +154,9 @@
 Preprint
 \url{http://arxiv.org/abs/1306.0818}
 
-Schepsmeier, U. (2013)
-Efficient goodness-of-fit tests in multi-dimensional vine copula models. 
-\url{http://arxiv.org/abs/1309.5808}
+Schepsmeier, U. (2015)
+Efficient information based goodness-of-fit tests for vine copula models with fixed margins.
+Journal of Multivariate Analysis 138, 34-52.
 
 White, H. (1982)
 Maximum likelihood estimation of misspecified models,
Modified: pkg/man/RVinePIT.Rd
===================================================================
--- pkg/man/RVinePIT.Rd	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg/man/RVinePIT.Rd	2015-05-28 13:37:47 UTC (rev 98)
@@ -46,9 +46,9 @@
 Remarks on a Multivariate Transformation. The Annals
 of Mathematical Statistics 23 (3), 470-472.
 
-Schepsmeier, U. (2013)
-Efficient goodness-of-fit tests in multi-dimensional vine copula models. 
-\url{http://arxiv.org/abs/1309.5808}
+Schepsmeier, U. (2015)
+Efficient information based goodness-of-fit tests for vine copula models with fixed margins.
+Journal of Multivariate Analysis 138, 34-52.
 }
 
 \examples{
Modified: pkg/man/VineCopula-package.Rd
===================================================================
--- pkg/man/VineCopula-package.Rd	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg/man/VineCopula-package.Rd	2015-05-28 13:37:47 UTC (rev 98)
@@ -14,7 +14,7 @@
 }
 
 \section{Remark}{
-The package VineCopula is a continuation of the package CDVine by U. Schepsmeier and E. C. Brechmann (see Brechmann and Schepsmeier (2013)).
+The package \code{VineCopula} is a continuation of the package \code{CDVine} by U. Schepsmeier and E. C. Brechmann (see Brechmann and Schepsmeier (2013)).
 It includes all functions implemented in CDVine for the bivariate case (BiCop-functions).
 }
 
@@ -159,7 +159,7 @@
 
 Schepsmeier, U. and J. Stoeber (2012).
 Derivatives and Fisher information of bivariate copulas.
-Statistical Papers, 55 (2), 525-542.
+Statistical Papers, 55 (2), 525-542. \cr
 \url{http://link.springer.com/article/10.1007/s00362-013-0498-x}.
 
 Schepsmeier, U. (2013)
@@ -168,11 +168,11 @@
 \url{http://arxiv.org/abs/1306.0818}
 
 Schepsmeier, U. (2015)
-Efficient information based goodness-of-fit tests for vine copula models with fixed margins. 
-Journal of Multivariate Analysis 138, 34–52.
+Efficient information based goodness-of-fit tests for vine copula models with fixed margins.
+Journal of Multivariate Analysis 138, 34-52.
 
 Stoeber, J. and U. Schepsmeier (2013).
-Estimating standard errors in regular vine copula models. Computational Statistics, 28 (6), 2679-2707
+Estimating standard errors in regular vine copula models. Computational Statistics, 28 (6), 2679-2707 \cr
 \url{http://link.springer.com/article/10.1007/s00180-013-0423-8#}.
 
 White, H. (1982)
Modified: pkg/man/pairs.copuladata.Rd
===================================================================
--- pkg/man/pairs.copuladata.Rd	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg/man/pairs.copuladata.Rd	2015-05-28 13:37:47 UTC (rev 98)
@@ -12,22 +12,48 @@
       lower.panel = lp.copuladata,
       upper.panel = up.copuladata,
       diag.panel = dp.copuladata,
-      label.pos = 0.85, cex.labels = 1, gap = 0)
+      label.pos = 0.85, cex.labels = 1, gap = 0,
+      method = "kendall", ccols = terrain.colors(30),
+      margins = "norm", margins.par = 0)
 }
 
 \arguments{
   \item{x}{\code{copuladata} object.}
   \item{labels}{variable names/labels.}
   \item{\dots}{other graphical parameters (see \code{\link[graphics]{par}}).}
-  \item{lower.panel}{panel function to be used on the lower diagonal panels}
-  \item{upper.panel}{panel function to be used on the upper diagonal panels}
-  \item{diag.panel}{panel function to be used on the diagonal panels}
+  \item{lower.panel}{panel function to be used on the lower diagonal panels (if not supplied, a default function is used)}
+  \item{upper.panel}{panel function to be used on the upper diagonal panels (if not supplied, a default function is used)}
+  \item{diag.panel}{panel function to be used on the diagonal panels (if not supplied, a default function is used)}
   \item{label.pos}{y position of labels in the diagonal panel; default: \code{label.pos = 0.85}.}
   \item{cex.labels}{magnification to be used for the labels of the diagonal panel; default: \code{cex.labels = 1}.}
   \item{gap}{distance between subplots, in margin lines; default: \code{gap = 0}.}
+If the default panel function \code{upper.panel} is used, the following parameters can be set additionally:
+\item{method}{a character string indicating which correlation coefficients are computed. One of \code{"pearson"}, \code{"kendall"} (default), or \code{"spearman"}}
+If the default panel function \code{lower.panel} (see \code{\link{BiCopMetaContour}}) is used, the following parameters can be set additionally:
+\item{ccols}{colour to be used for the contour plots; default: \code{ccols = terrain.colors(30)}.}
+\item{margins}{character; margins for the contour plots. Possible margins are:\cr
+                 \code{"norm"} = standard normal margins (default)\cr
+                 \code{"t"} = Student t margins with degrees of freedom as specified by \code{margins.par}\cr
+                 \code{"gamma"} = Gamma margins with shape and scale as specified by \code{margins.par}\cr
+                 \code{"exp"} = Exponential margins with rate as specified by \code{margins.par}\cr
+                 \code{"unif"} = uniform margins}
+  \item{margins.par}{parameter(s) of the distribution of the margins (of the contour plots) if necessary (default: \code{margins.par = 0}), i.e., 
+                     \itemize{
+                       \item a positive real number for the degrees of freedom of Student t margins (see \code{\link{dt}}),
+                        \item a 2-dimensional vector of positive real numbers for the shape and scale parameters of Gamma margins (see \code{\link{dgamma}}),
+                        \item a positive real number for the rate parameter of exponential margins (see \code{\link{dexp}}). 
+                     }}
 }
 
+\note{
+If the default panel functions are used \cr
+\itemize{
+\item \code{col} changes only the colour of the points in the scatter plot (\code{upper.panel}) \cr
+\item \code{cex} changes only the magnification of the points in the scatter plot (\code{upper.panel})
+}
+}
 
+
 \author{Tobias Erhardt}
 
 \seealso{\code{\link[graphics]{pairs}}, \code{\link{as.copuladata}}, \code{\link{BiCopMetaContour}}}
@@ -36,19 +62,22 @@
 data(daxreturns)
 
 data <- as.copuladata(daxreturns)
+sel <- c(4,5,14,15)
 
 ## pairs plot with default settings
-pairs(data[1:5])
+pairs(data[sel])
 
 ## pairs plot with custom settings
 nlevels <- 20
-pairs(data[1:5], cex = 2, pch = 1,
+pairs(data[sel], cex = 2, pch = 1, col = "black",
       diag.panel = NULL, label.pos = 0.5,
-      cex.labels = 2.5, gap = 1)
+      cex.labels = 2.5, gap = 1,
+      method = "pearson", ccols = heat.colors(nlevels),
+      margins = "gamma", margins.par = c(1,1))
       
 ## pairs plot with own panel functions
-up.copuladata <- function(x, y) {
-  # lower panel: empirical contour plot
+up <- function(x, y) {
+  # upper panel: empirical contour plot
   op <- par(usr = c(-3, 3, -3, 3), new = TRUE)
   BiCopMetaContour(x, y, bw = 2, levels = c(0.01, 0.05, 0.1, 0.15, 0.2),
                     # exponential margins
@@ -57,8 +86,8 @@
   on.exit(par(op))
 }
 
-lp.copuladata <- function(x, y) {
-  # upper panel: scatter plot (copula data) and correlation
+lp <- function(x, y) {
+  # lower panel: scatter plot (copula data) and correlation
   op <- par(usr = c(0, 1, 0, 1), new = TRUE)
   points(x, y, pch = 1, col = "black")
   r <- cor(x, y, method = "spearman") # Spearman's rho
@@ -67,16 +96,15 @@
   on.exit(par(op))
 }
 
-dp.copuladata <- function(x) {
+dp <- function(x) {
   # diagonal panel: histograms (copula data)
   op <- par(usr = c(0, 1, 0, 1.5), new = TRUE)
-  hist(x, freq = FALSE, add = TRUE, col = "brown", border = "white", main = "")
+  hist(x, freq = FALSE, add = TRUE, col = "brown", border = "black", main = "")
   abline(h = 1, col = "black", lty = 2)
   on.exit(par(op))
 }
 
 nlevels <- 20
-pairs(data[1:5],
-      lower.panel = lp.copuladata, upper.panel = up.copuladata,
-      diag.panel = dp.copuladata, gap = 0.5)
+pairs(data[sel],
+      lower.panel = lp, upper.panel = up, diag.panel = dp, gap = 0.5)
 }
Modified: pkg.pdf
===================================================================
--- pkg.pdf	2015-05-27 18:06:14 UTC (rev 97)
+++ pkg.pdf	2015-05-28 13:37:47 UTC (rev 98)
@@ -7,15622 +7,16913 @@
 (VineCopula-package)
 endobj
 5 0 obj
-<< /S /GoTo /D (Rfn.BB1Copula.1) >>
+<< /S /GoTo /D (Rfn.as.copuladata.1) >>
 endobj
 8 0 obj
-(BB1Copula)
+(as.copuladata)
 endobj
 9 0 obj
-<< /S /GoTo /D (Rfn.BB1Copula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.BB1Copula.1) >>
 endobj
 12 0 obj
-(BB1Copula-class)
+(BB1Copula)
 endobj
 13 0 obj
-<< /S /GoTo /D (Rfn.BB6Copula.1) >>
+<< /S /GoTo /D (Rfn.BB1Copula.Rdash.class.1) >>
 endobj
 16 0 obj
-(BB6Copula)
+(BB1Copula-class)
 endobj
 17 0 obj
-<< /S /GoTo /D (Rfn.BB6Copula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.BB6Copula.1) >>
 endobj
 20 0 obj
-(BB6Copula-class)
+(BB6Copula)
 endobj
 21 0 obj
-<< /S /GoTo /D (Rfn.BB7Copula.1) >>
+<< /S /GoTo /D (Rfn.BB6Copula.Rdash.class.1) >>
 endobj
 24 0 obj
-(BB7Copula)
+(BB6Copula-class)
 endobj
 25 0 obj
-<< /S /GoTo /D (Rfn.BB7Copula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.BB7Copula.1) >>
 endobj
 28 0 obj
-(BB7Copula-class)
+(BB7Copula)
 endobj
 29 0 obj
-<< /S /GoTo /D (Rfn.BB8Copula.1) >>
+<< /S /GoTo /D (Rfn.BB7Copula.Rdash.class.1) >>
 endobj
 32 0 obj
-(BB8Copula)
+(BB7Copula-class)
 endobj
 33 0 obj
-<< /S /GoTo /D (Rfn.BB8Copula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.BB8Copula.1) >>
 endobj
 36 0 obj
-(BB8Copula-class)
+(BB8Copula)
 endobj
 37 0 obj
-<< /S /GoTo /D (Rfn.BetaMatrix.1) >>
+<< /S /GoTo /D (Rfn.BB8Copula.Rdash.class.1) >>
 endobj
 40 0 obj
-(BetaMatrix)
+(BB8Copula-class)
 endobj
 41 0 obj
-<< /S /GoTo /D (Rfn.BiCopCDF.1) >>
+<< /S /GoTo /D (Rfn.BetaMatrix.1) >>
 endobj
 44 0 obj
-(BiCopCDF)
+(BetaMatrix)
 endobj
 45 0 obj
-<< /S /GoTo /D (Rfn.BiCopChiPlot.1) >>
+<< /S /GoTo /D (Rfn.BiCop.1) >>
 endobj
 48 0 obj
-(BiCopChiPlot)
+(BiCop)
 endobj
 49 0 obj
-<< /S /GoTo /D (Rfn.BiCopDeriv.1) >>
+<< /S /GoTo /D (Rfn.BiCopCDF.1) >>
 endobj
 52 0 obj
-(BiCopDeriv)
+(BiCopCDF)
 endobj
 53 0 obj
-<< /S /GoTo /D (Rfn.BiCopDeriv2.1) >>
+<< /S /GoTo /D (Rfn.BiCopChiPlot.1) >>
 endobj
 56 0 obj
-(BiCopDeriv2)
+(BiCopChiPlot)
 endobj
 57 0 obj
-<< /S /GoTo /D (Rfn.BiCopEst.1) >>
+<< /S /GoTo /D (Rfn.BiCopDeriv.1) >>
 endobj
 60 0 obj
-(BiCopEst)
+(BiCopDeriv)
 endobj
 61 0 obj
-<< /S /GoTo /D (Rfn.BiCopGofTest.1) >>
+<< /S /GoTo /D (Rfn.BiCopDeriv2.1) >>
 endobj
 64 0 obj
-(BiCopGofTest)
+(BiCopDeriv2)
 endobj
 65 0 obj
-<< /S /GoTo /D (Rfn.BiCopHfunc.1) >>
+<< /S /GoTo /D (Rfn.BiCopEst.1) >>
 endobj
 68 0 obj
-(BiCopHfunc)
+(BiCopEst)
 endobj
 69 0 obj
-<< /S /GoTo /D (Rfn.BiCopHfuncDeriv.1) >>
+<< /S /GoTo /D (Rfn.BiCopGofTest.1) >>
 endobj
 72 0 obj
-(BiCopHfuncDeriv)
+(BiCopGofTest)
 endobj
 73 0 obj
-<< /S /GoTo /D (Rfn.BiCopHfuncDeriv2.1) >>
+<< /S /GoTo /D (Rfn.BiCopHfunc.1) >>
 endobj
 76 0 obj
-(BiCopHfuncDeriv2)
+(BiCopHfunc)
 endobj
 77 0 obj
-<< /S /GoTo /D (Rfn.BiCopIndTest.1) >>
+<< /S /GoTo /D (Rfn.BiCopHfuncDeriv.1) >>
 endobj
 80 0 obj
-(BiCopIndTest)
+(BiCopHfuncDeriv)
 endobj
 81 0 obj
-<< /S /GoTo /D (Rfn.BiCopKPlot.1) >>
+<< /S /GoTo /D (Rfn.BiCopHfuncDeriv2.1) >>
 endobj
 84 0 obj
-(BiCopKPlot)
+(BiCopHfuncDeriv2)
 endobj
 85 0 obj
-<< /S /GoTo /D (Rfn.BiCopLambda.1) >>
+<< /S /GoTo /D (Rfn.BiCopIndTest.1) >>
 endobj
 88 0 obj
-(BiCopLambda)
+(BiCopIndTest)
 endobj
 89 0 obj
-<< /S /GoTo /D (Rfn.BiCopMetaContour.1) >>
+<< /S /GoTo /D (Rfn.BiCopKPlot.1) >>
 endobj
 92 0 obj
-(BiCopMetaContour)
+(BiCopKPlot)
 endobj
 93 0 obj
-<< /S /GoTo /D (Rfn.BiCopName.1) >>
+<< /S /GoTo /D (Rfn.BiCopLambda.1) >>
 endobj
 96 0 obj
-(BiCopName)
+(BiCopLambda)
 endobj
 97 0 obj
-<< /S /GoTo /D (Rfn.BiCopPar2Beta.1) >>
+<< /S /GoTo /D (Rfn.BiCopMetaContour.1) >>
 endobj
 100 0 obj
-(BiCopPar2Beta)
+(BiCopMetaContour)
 endobj
 101 0 obj
-<< /S /GoTo /D (Rfn.BiCopPar2TailDep.1) >>
+<< /S /GoTo /D (Rfn.BiCopName.1) >>
 endobj
 104 0 obj
-(BiCopPar2TailDep)
+(BiCopName)
 endobj
 105 0 obj
-<< /S /GoTo /D (Rfn.BiCopPar2Tau.1) >>
+<< /S /GoTo /D (Rfn.BiCopPar2Beta.1) >>
 endobj
 108 0 obj
-(BiCopPar2Tau)
+(BiCopPar2Beta)
 endobj
 109 0 obj
-<< /S /GoTo /D (Rfn.BiCopPDF.1) >>
+<< /S /GoTo /D (Rfn.BiCopPar2TailDep.1) >>
 endobj
 112 0 obj
-(BiCopPDF)
+(BiCopPar2TailDep)
 endobj
 113 0 obj
-<< /S /GoTo /D (Rfn.BiCopSelect.1) >>
+<< /S /GoTo /D (Rfn.BiCopPar2Tau.1) >>
 endobj
 116 0 obj
-(BiCopSelect)
+(BiCopPar2Tau)
 endobj
 117 0 obj
-<< /S /GoTo /D (Rfn.BiCopSim.1) >>
+<< /S /GoTo /D (Rfn.BiCopPDF.1) >>
 endobj
 120 0 obj
-(BiCopSim)
+(BiCopPDF)
 endobj
 121 0 obj
-<< /S /GoTo /D (Rfn.BiCopTau2Par.1) >>
+<< /S /GoTo /D (Rfn.BiCopSelect.1) >>
 endobj
 124 0 obj
-(BiCopTau2Par)
+(BiCopSelect)
 endobj
 125 0 obj
-<< /S /GoTo /D (Rfn.BiCopVuongClarke.1) >>
+<< /S /GoTo /D (Rfn.BiCopSim.1) >>
 endobj
 128 0 obj
-(BiCopVuongClarke)
+(BiCopSim)
 endobj
 129 0 obj
-<< /S /GoTo /D (Rfn.C2RVine.1) >>
+<< /S /GoTo /D (Rfn.BiCopTau2Par.1) >>
 endobj
 132 0 obj
-(C2RVine)
+(BiCopTau2Par)
 endobj
 133 0 obj
-<< /S /GoTo /D (Rfn.copulaFromFamilyIndex.1) >>
+<< /S /GoTo /D (Rfn.BiCopVuongClarke.1) >>
 endobj
 136 0 obj
-(copulaFromFamilyIndex)
+(BiCopVuongClarke)
 endobj
 137 0 obj
-<< /S /GoTo /D (Rfn.D2RVine.1) >>
+<< /S /GoTo /D (Rfn.C2RVine.1) >>
 endobj
 140 0 obj
-(D2RVine)
+(C2RVine)
 endobj
 141 0 obj
-<< /S /GoTo /D (Rfn.daxreturns.1) >>
+<< /S /GoTo /D (Rfn.copulaFromFamilyIndex.1) >>
 endobj
 144 0 obj
-(daxreturns)
+(copulaFromFamilyIndex)
 endobj
 145 0 obj
-<< /S /GoTo /D (Rfn.dduCopula.1) >>
+<< /S /GoTo /D (Rfn.D2RVine.1) >>
 endobj
 148 0 obj
-(dduCopula)
+(D2RVine)
 endobj
 149 0 obj
-<< /S /GoTo /D (Rfn.joeBiCopula.1) >>
+<< /S /GoTo /D (Rfn.daxreturns.1) >>
 endobj
 152 0 obj
-(joeBiCopula)
+(daxreturns)
 endobj
 153 0 obj
-<< /S /GoTo /D (Rfn.joeBiCopula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.dduCopula.1) >>
 endobj
 156 0 obj
-(joeBiCopula-class)
+(dduCopula)
 endobj
 157 0 obj
-<< /S /GoTo /D (Rfn.pobs.1) >>
+<< /S /GoTo /D (Rfn.joeBiCopula.1) >>
 endobj
 160 0 obj
-(pobs)
+(joeBiCopula)
 endobj
 161 0 obj
-<< /S /GoTo /D (Rfn.RVineAIC/BIC.1) >>
+<< /S /GoTo /D (Rfn.joeBiCopula.Rdash.class.1) >>
 endobj
 164 0 obj
-(RVineAIC/BIC)
+(joeBiCopula-class)
 endobj
 165 0 obj
-<< /S /GoTo /D (Rfn.RVineClarkeTest.1) >>
+<< /S /GoTo /D (Rfn.pairs.copuladata.1) >>
 endobj
 168 0 obj
-(RVineClarkeTest)
+(pairs.copuladata)
 endobj
 169 0 obj
-<< /S /GoTo /D (Rfn.RVineCopSelect.1) >>
+<< /S /GoTo /D (Rfn.plot.BiCop.1) >>
 endobj
 172 0 obj
-(RVineCopSelect)
+(plot.BiCop)
 endobj
 173 0 obj
-<< /S /GoTo /D (Rfn.RVineCor2pcor.1) >>
+<< /S /GoTo /D (Rfn.pobs.1) >>
 endobj
 176 0 obj
-(RVineCor2pcor)
+(pobs)
 endobj
 177 0 obj
-<< /S /GoTo /D (Rfn.RVineGofTest.1) >>
+<< /S /GoTo /D (Rfn.RVineAIC/BIC.1) >>
 endobj
 180 0 obj
-(RVineGofTest)
+(RVineAIC/BIC)
 endobj
 181 0 obj
-<< /S /GoTo /D (Rfn.RVineGrad.1) >>
+<< /S /GoTo /D (Rfn.RVineClarkeTest.1) >>
 endobj
 184 0 obj
-(RVineGrad)
+(RVineClarkeTest)
 endobj
 185 0 obj
-<< /S /GoTo /D (Rfn.RVineHessian.1) >>
+<< /S /GoTo /D (Rfn.RVineCopSelect.1) >>
 endobj
 188 0 obj
-(RVineHessian)
+(RVineCopSelect)
 endobj
 189 0 obj
-<< /S /GoTo /D (Rfn.RVineLogLik.1) >>
+<< /S /GoTo /D (Rfn.RVineCor2pcor.1) >>
 endobj
 192 0 obj
-(RVineLogLik)
+(RVineCor2pcor)
 endobj
 193 0 obj
-<< /S /GoTo /D (Rfn.RVineMatrix.1) >>
+<< /S /GoTo /D (Rfn.RVineGofTest.1) >>
 endobj
 196 0 obj
-(RVineMatrix)
+(RVineGofTest)
 endobj
 197 0 obj
-<< /S /GoTo /D (Rfn.RVineMatrixCheck.1) >>
+<< /S /GoTo /D (Rfn.RVineGrad.1) >>
 endobj
 200 0 obj
-(RVineMatrixCheck)
+(RVineGrad)
 endobj
 201 0 obj
-<< /S /GoTo /D (Rfn.RVineMatrixNormalize.1) >>
+<< /S /GoTo /D (Rfn.RVineHessian.1) >>
 endobj
 204 0 obj
-(RVineMatrixNormalize)
+(RVineHessian)
 endobj
 205 0 obj
-<< /S /GoTo /D (Rfn.RVineMLE.1) >>
+<< /S /GoTo /D (Rfn.RVineLogLik.1) >>
 endobj
 208 0 obj
-(RVineMLE)
+(RVineLogLik)
 endobj
 209 0 obj
-<< /S /GoTo /D (Rfn.RVinePar2Beta.1) >>
+<< /S /GoTo /D (Rfn.RVineMatrix.1) >>
 endobj
 212 0 obj
-(RVinePar2Beta)
+(RVineMatrix)
 endobj
 213 0 obj
-<< /S /GoTo /D (Rfn.RVinePar2Tau.1) >>
+<< /S /GoTo /D (Rfn.RVineMatrixCheck.1) >>
 endobj
 216 0 obj
-(RVinePar2Tau)
+(RVineMatrixCheck)
 endobj
 217 0 obj
-<< /S /GoTo /D (Rfn.RVinePIT.1) >>
+<< /S /GoTo /D (Rfn.RVineMatrixNormalize.1) >>
 endobj
 220 0 obj
-(RVinePIT)
+(RVineMatrixNormalize)
 endobj
 221 0 obj
-<< /S /GoTo /D (Rfn.RVineSeqEst.1) >>
+<< /S /GoTo /D (Rfn.RVineMLE.1) >>
 endobj
 224 0 obj
-(RVineSeqEst)
+(RVineMLE)
 endobj
 225 0 obj
-<< /S /GoTo /D (Rfn.RVineSim.1) >>
+<< /S /GoTo /D (Rfn.RVinePar2Beta.1) >>
 endobj
 228 0 obj
-(RVineSim)
+(RVinePar2Beta)
 endobj
 229 0 obj
-<< /S /GoTo /D (Rfn.RVineStdError.1) >>
+<< /S /GoTo /D (Rfn.RVinePar2Tau.1) >>
 endobj
 232 0 obj
-(RVineStdError)
+(RVinePar2Tau)
 endobj
 233 0 obj
-<< /S /GoTo /D (Rfn.RVineStructureSelect.1) >>
+<< /S /GoTo /D (Rfn.RVinePDF.1) >>
 endobj
 236 0 obj
-(RVineStructureSelect)
+(RVinePDF)
 endobj
 237 0 obj
-<< /S /GoTo /D (Rfn.RVineTreePlot.1) >>
+<< /S /GoTo /D (Rfn.RVinePIT.1) >>
 endobj
 240 0 obj
-(RVineTreePlot)
+(RVinePIT)
 endobj
 241 0 obj
-<< /S /GoTo /D (Rfn.RVineVuongTest.1) >>
+<< /S /GoTo /D (Rfn.RVineSeqEst.1) >>
 endobj
 244 0 obj
-(RVineVuongTest)
+(RVineSeqEst)
 endobj
 245 0 obj
-<< /S /GoTo /D (Rfn.surClaytonCopula.1) >>
+<< /S /GoTo /D (Rfn.RVineSim.1) >>
 endobj
 248 0 obj
-(surClaytonCopula)
+(RVineSim)
 endobj
 249 0 obj
-<< /S /GoTo /D (Rfn.surClaytonCopula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.RVineStdError.1) >>
 endobj
 252 0 obj
-(surClaytonCopula-class)
+(RVineStdError)
 endobj
 253 0 obj
-<< /S /GoTo /D (Rfn.surGumbelCopula.1) >>
+<< /S /GoTo /D (Rfn.RVineStructureSelect.1) >>
 endobj
 256 0 obj
-(surGumbelCopula)
+(RVineStructureSelect)
 endobj
 257 0 obj
-<< /S /GoTo /D (Rfn.surGumbelCopula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.RVineTreePlot.1) >>
 endobj
 260 0 obj
-(surGumbelCopula-class)
+(RVineTreePlot)
 endobj
 261 0 obj
-<< /S /GoTo /D (Rfn.TauMatrix.1) >>
+<< /S /GoTo /D (Rfn.RVineVuongTest.1) >>
 endobj
 264 0 obj
-(TauMatrix)
+(RVineVuongTest)
 endobj
 265 0 obj
-<< /S /GoTo /D (Rfn.tawnT1Copula.1) >>
+<< /S /GoTo /D (Rfn.surClaytonCopula.1) >>
 endobj
 268 0 obj
-(tawnT1Copula)
+(surClaytonCopula)
 endobj
 269 0 obj
-<< /S /GoTo /D (Rfn.tawnT1Copula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.surClaytonCopula.Rdash.class.1) >>
 endobj
 272 0 obj
-(tawnT1Copula-class)
+(surClaytonCopula-class)
 endobj
 273 0 obj
-<< /S /GoTo /D (Rfn.tawnT2Copula.1) >>
+<< /S /GoTo /D (Rfn.surGumbelCopula.1) >>
 endobj
 276 0 obj
-(tawnT2Copula)
+(surGumbelCopula)
 endobj
 277 0 obj
-<< /S /GoTo /D (Rfn.tawnT2Copula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.surGumbelCopula.Rdash.class.1) >>
 endobj
 280 0 obj
-(tawnT2Copula-class)
+(surGumbelCopula-class)
 endobj
 281 0 obj
-<< /S /GoTo /D (Rfn.vineCopula.1) >>
+<< /S /GoTo /D (Rfn.TauMatrix.1) >>
 endobj
 284 0 obj
-(vineCopula)
+(TauMatrix)
 endobj
 285 0 obj
-<< /S /GoTo /D (Rfn.vineCopula.Rdash.class.1) >>
+<< /S /GoTo /D (Rfn.tawnT1Copula.1) >>
 endobj
 288 0 obj
-(vineCopula-class)
+(tawnT1Copula)
 endobj
 289 0 obj
-<< /S /GoTo /D (index.0) >>
+<< /S /GoTo /D (Rfn.tawnT1Copula.Rdash.class.1) >>
 endobj
 292 0 obj
-(Index)
+(tawnT1Copula-class)
 endobj
 293 0 obj
-<< /S /GoTo /D [294 0 R /Fit] >>
+<< /S /GoTo /D (Rfn.tawnT2Copula.1) >>
 endobj
-313 0 obj <<
-/Length 1282      
+296 0 obj
+(tawnT2Copula)
+endobj
+297 0 obj
+<< /S /GoTo /D (Rfn.tawnT2Copula.Rdash.class.1) >>
+endobj
+300 0 obj
+(tawnT2Copula-class)
+endobj
+301 0 obj
+<< /S /GoTo /D (Rfn.vineCopula.1) >>
+endobj
+304 0 obj
+(vineCopula)
+endobj
+305 0 obj
+<< /S /GoTo /D (Rfn.vineCopula.Rdash.class.1) >>
+endobj
+308 0 obj
+(vineCopula-class)
+endobj
+309 0 obj
+<< /S /GoTo /D (index.0) >>
+endobj
+312 0 obj
+(Index)
+endobj
+313 0 obj
+<< /S /GoTo /D [314 0 R /Fit] >>
+endobj
+333 0 obj <<
+/Length 1314      
 /Filter /FlateDecode
 >>
 stream
-x[o6+68ubI
-!tHEQt$UHe[KsxxK/.O/\'?]#cB&(b $ޢ>Mn8-'4q&Q]_+{RPQ9W^3ddG{`Fm,PXq4&EɌ4&O-]oiu^@-!qp:W$N\1%:%rV?w\:;s8Ҍn@g`Gآ`e'z0A8FQMv@ӌ}Ҭ7O}.EESVF:DQ(-ymWq
-+vøTooۄ;j3<<_U3^B+3\s4F{DGCXbj1[,I?B-Em n*
-E7fp!#πo~鎠HrzlFQaH֧nZFVv$+CesBS[lp%{4\r)Zx0uSB'Iؖdqe`;V澃D}m/TP͉6Xz Tx<QNuLWlzoU5wLrWn(xcBt_5^5zvOjfZWfPUUbΪ[.	U64i:5brڬmfvݺr4TL+`]jJy.Ck|8 at K'p{[tm\
-u,ϟuwq}77z9Q{κ,9E9?	.o){2{nX1ZRi?h;oVl_UJC=CA-_"oȶϾ(&8ݱff8DYD8մ"aU49D
-ESj`ũkLv0 )z%ʲ0PI=4.OO>`5M1 (i-&LPù/=$9~)01_{:?FW=8xc5h|˝1txY{ϔ&~A!. g{x
-Wl0f>4>R(7`'Ϸ=~SDI76	1;6.N)
+xY[o6~ϯlDJe؊5Nh
+#1I(:Hw(R{b"y.x{O<O'?	G|Ezk("#:>.؟m|A?<gKݕw '0F)ȉ(!`?+$y>poPkM҈DFi
+$r8oÓIPt1uGӆ帺$ԭ4Ӣ"cm}3O70ڙ7	ϸjlbSو8n@ӇPH܅O$>94Pjxt!ըCqҠU6dzo^ؗ؍a)I!B_EڲP&xgE]>5ō
+u!+`m`ac&j
+|u>yb\j@*ʵ읋0IwgݞAnU*(yΛ1C;Ko~'ǪVj+U}:xZTZFm-q `YN7yuv.!
+gޕLÍ/ΌxfRl~INzu9>nMVH4D^&KǵkJ	ݚknRݶi\șfvjV7C+B,v}^)
+D־';³[eWF+ދv1営JoEsX790ɘuՁ o=\肫@wTe7KBpٝvcKe(AŊURo
+,AЀ6s5D/ΦUZvB^j|-T~:hMlR[vbfLyca|ԝLW4C{{r2@UL=ju#`uB?%GT0M;|qZ>p7KYmEe$5vʴvY1^9|DhdEkvST0"2kIw ;qZnEhD
+I⧾kA$㢧a^)t|%̆Wʇ_%2S;x~}^ ڳ^lA&[AͦM/]o#9>C!+G
+t<4^ivӀ^p?&ӀN^܃392;'1kvwA{x:	xIr{bhr go#x:셸,>b=?ac#(	}az}/H!С
 endstream
 endobj
-294 0 obj <<
+314 0 obj <<
 /Type /Page
-/Contents 313 0 R
-/Resources 312 0 R
+/Contents 333 0 R
+/Resources 332 0 R
 /MediaBox [0 0 595.276 841.89]
-/Parent 322 0 R
-/Annots [ 295 0 R 296 0 R 297 0 R 298 0 R 299 0 R 300 0 R 301 0 R 302 0 R 303 0 R 304 0 R 305 0 R 306 0 R 307 0 R 308 0 R ]
+/Parent 342 0 R
+/Annots [ 315 0 R 316 0 R 317 0 R 318 0 R 319 0 R 320 0 R 321 0 R 322 0 R 323 0 R 324 0 R 325 0 R 326 0 R 327 0 R 328 0 R ]
 >> endobj
-295 0 obj <<
+315 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [506.111 268.568 513.085 277.414]
 /A << /S /GoTo /D (page.3) >>
 >> endobj
-296 0 obj <<
+316 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [506.111 256.497 513.085 265.344]
 /A << /S /GoTo /D (page.6) >>
 >> endobj
-297 0 obj <<
+317 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [506.111 244.427 513.085 253.005]
-/A << /S /GoTo /D (page.7) >>
+/Rect [506.111 244.427 513.085 253.274]
+/A << /S /GoTo /D (page.6) >>
 >> endobj
-298 0 obj <<
+318 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [506.111 232.357 513.085 241.204]
-/A << /S /GoTo /D (page.8) >>
+/Rect [506.111 232.357 513.085 240.935]
+/A << /S /GoTo /D (page.7) >>
 >> endobj
-299 0 obj <<
+319 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [506.111 220.167 513.085 229.133]
 /A << /S /GoTo /D (page.9) >>
 >> endobj
-300 0 obj <<
+320 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 208.217 513.085 217.063]
 /A << /S /GoTo /D (page.10) >>
 >> endobj
-301 0 obj <<
+321 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 196.246 513.085 204.993]
 /A << /S /GoTo /D (page.11) >>
 >> endobj
-302 0 obj <<
+322 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 184.176 513.085 192.923]
 /A << /S /GoTo /D (page.12) >>
 >> endobj
-303 0 obj <<
+323 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 172.006 513.085 180.853]
 /A << /S /GoTo /D (page.13) >>
 >> endobj
-304 0 obj <<
+324 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 160.035 513.085 168.782]
 /A << /S /GoTo /D (page.14) >>
 >> endobj
-305 0 obj <<
+325 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 147.866 513.085 156.712]
 /A << /S /GoTo /D (page.15) >>
 >> endobj
-306 0 obj <<
+326 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 135.795 513.085 144.642]
 /A << /S /GoTo /D (page.16) >>
 >> endobj
-307 0 obj <<
+327 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [501.13 123.725 513.085 132.572]
-/A << /S /GoTo /D (page.18) >>
+/A << /S /GoTo /D (page.17) >>
 >> endobj
-308 0 obj <<
+328 0 obj <<
 /Type /Annot
 /Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [501.13 111.655 513.085 120.502]
-/A << /S /GoTo /D (page.20) >>
+/Rect [501.13 111.535 513.085 120.502]
+/A << /S /GoTo /D (page.19) >>
 >> endobj
-314 0 obj <<
-/D [294 0 R /XYZ 99.346 773.487 null]
+334 0 obj <<
+/D [314 0 R /XYZ 99.346 773.487 null]
 >> endobj
-315 0 obj <<
-/D [294 0 R /XYZ 100.346 742.532 null]
+335 0 obj <<
+/D [314 0 R /XYZ 100.346 742.532 null]
 >> endobj
-316 0 obj <<
-/D [294 0 R /XYZ 100.346 742.532 null]
+336 0 obj <<
+/D [314 0 R /XYZ 100.346 742.532 null]
 >> endobj
-320 0 obj <<
-/D [294 0 R /XYZ 100.346 310.064 null]
+340 0 obj <<
+/D [314 0 R /XYZ 100.346 310.064 null]
 >> endobj
-312 0 obj <<
-/Font << /F35 317 0 R /F36 318 0 R /F22 319 0 R /F39 321 0 R >>
+332 0 obj <<
+/Font << /F35 337 0 R /F36 338 0 R /F22 339 0 R /F39 341 0 R >>
 /ProcSet [ /PDF /Text ]
 >> endobj
-389 0 obj <<
-/Length 1057      
+408 0 obj <<
+/Length 1049      
 /Filter /FlateDecode
 >>
 stream
[TRUNCATED]
To get the complete diff run:
    svnlook diff /svnroot/vinecopula -r 98
    
    
Mehr Informationen über die Mailingliste Vinecopula-commits