[Robast-commits] r973 - branches/robast-1.1/pkg/RobExtremes/R

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Wed Jul 18 17:58:37 CEST 2018


Author: ruckdeschel
Date: 2018-07-18 17:58:37 +0200 (Wed, 18 Jul 2018)
New Revision: 973

Modified:
   branches/robast-1.1/pkg/RobExtremes/R/Expectation.R
   branches/robast-1.1/pkg/RobExtremes/R/asvarMedkMAD.R
   branches/robast-1.1/pkg/RobExtremes/R/asvarPickands.R
   branches/robast-1.1/pkg/RobExtremes/R/kMAD.R
   branches/robast-1.1/pkg/RobExtremes/R/rescaleFct.R
Log:
[RobExtremes] branch 1.1 changed q() to q.l in R-Code 

Modified: branches/robast-1.1/pkg/RobExtremes/R/Expectation.R
===================================================================
--- branches/robast-1.1/pkg/RobExtremes/R/Expectation.R	2018-07-18 15:56:24 UTC (rev 972)
+++ branches/robast-1.1/pkg/RobExtremes/R/Expectation.R	2018-07-18 15:58:37 UTC (rev 973)
@@ -59,7 +59,7 @@
         if(!is.null(dots$useApply)) useApply <- dots$useApply
         dots.withoutUseApply$useApply <- NULL
         integrand <- function(x, dfun, ...){   di <- dim(x)
-                                               y <- q(object)(x)##quantile transformation
+                                               y <- q.l(object)(x)##quantile transformation
                                                if(useApply){
                                                     funy <- sapply(y,fun, ...)
                                                     dim(y) <- di

Modified: branches/robast-1.1/pkg/RobExtremes/R/asvarMedkMAD.R
===================================================================
--- branches/robast-1.1/pkg/RobExtremes/R/asvarMedkMAD.R	2018-07-18 15:56:24 UTC (rev 972)
+++ branches/robast-1.1/pkg/RobExtremes/R/asvarMedkMAD.R	2018-07-18 15:58:37 UTC (rev 973)
@@ -7,7 +7,7 @@
   beta <- par0[1]; xi <- par0[2]
 
   M <- kMAD(model at distribution, k=k)
-  m <- q(model)(.5)
+  m <- q.l(model)(.5)
 
   x1.0 <- m - M
   x2.0 <- m + k * M

Modified: branches/robast-1.1/pkg/RobExtremes/R/asvarPickands.R
===================================================================
--- branches/robast-1.1/pkg/RobExtremes/R/asvarPickands.R	2018-07-18 15:56:24 UTC (rev 972)
+++ branches/robast-1.1/pkg/RobExtremes/R/asvarPickands.R	2018-07-18 15:58:37 UTC (rev 973)
@@ -16,8 +16,8 @@
     al2 <- exp(-1/alpha^2)
   }
 
-  M2 <- q(model)(al1)
-  M4 <- q(model)(al2)
+  M2 <- q.l(model)(al1)
+  M4 <- q.l(model)(al2)
 
   xi <- log((M4-M2)/M2)/log(alpha)
   qu <- 1/(alpha^xi-1)
@@ -82,7 +82,7 @@
 
  if(p1>=p2) {p<-p1; p1 <- p2; p2 <- p}
 
-  qm <- q(model)
+  qm <- q.l(model)
   Q1 <- qm(p1)
   Q2 <- qm(p2)
   l1 <- -log(p1); l2 <- -log(p2)

Modified: branches/robast-1.1/pkg/RobExtremes/R/kMAD.R
===================================================================
--- branches/robast-1.1/pkg/RobExtremes/R/kMAD.R	2018-07-18 15:56:24 UTC (rev 972)
+++ branches/robast-1.1/pkg/RobExtremes/R/kMAD.R	2018-07-18 15:58:37 UTC (rev 973)
@@ -24,7 +24,7 @@
        if(! length(k)==1) stop ("k has to be a numeric of length 1")
        if(k<=0) stop ("k has to be strictly positive")
        m <- median(x)
-       if(is.null(up)) up <- min(3*IQR(x),q(x)(1)-m,m-q(x)(0))
+       if(is.null(up)) up <- min(3*IQR(x),q.l(x)(1)-m,m-q.l(x)(0))
        fun <- function(t)
            {p(x)(m+k*t)-p(x)(m-t)-.5}
        return(uniroot(fun,lower=0,upper=up)$root)

Modified: branches/robast-1.1/pkg/RobExtremes/R/rescaleFct.R
===================================================================
--- branches/robast-1.1/pkg/RobExtremes/R/rescaleFct.R	2018-07-18 15:56:24 UTC (rev 972)
+++ branches/robast-1.1/pkg/RobExtremes/R/rescaleFct.R	2018-07-18 15:58:37 UTC (rev 973)
@@ -18,7 +18,7 @@
       distr <- distribution(L2Fam)
       scaleList <- list(scaleX = substitute(TRUE)
                         ,scaleX.fct = substitute(p(distr))
-                        ,scaleX.inv = substitute(q(distr))
+                        ,scaleX.inv = substitute(q.l(distr))
                         ,scaleY = substitute(TRUE)
                         ,scaleY.fct = substitute(pnorm)
                         ,scaleY.inv = substitute(qnorm)



More information about the Robast-commits mailing list