[Robast-commits] r1144 - branches/robast-1.2/pkg/ROptEst/R

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Wed Aug 15 22:45:41 CEST 2018


Author: ruckdeschel
Date: 2018-08-15 22:45:40 +0200 (Wed, 15 Aug 2018)
New Revision: 1144

Modified:
   branches/robast-1.2/pkg/ROptEst/R/CheckMakeContIC.R
   branches/robast-1.2/pkg/ROptEst/R/L1L2normL2deriv.R
   branches/robast-1.2/pkg/ROptEst/R/LowerCaseMultivariate.R
   branches/robast-1.2/pkg/ROptEst/R/getInfCent.R
   branches/robast-1.2/pkg/ROptEst/R/getInfClip.R
   branches/robast-1.2/pkg/ROptEst/R/getInfGamma.R
   branches/robast-1.2/pkg/ROptEst/R/getInfLM.R
   branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asAnscombe.R
   branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asGRisk.R
   branches/robast-1.2/pkg/ROptEst/R/getInfStand.R
   branches/robast-1.2/pkg/ROptEst/R/getInfV.R
   branches/robast-1.2/pkg/ROptEst/R/leastFavorableRadius.R
   branches/robast-1.2/pkg/ROptEst/R/radiusMinimaxIC.R
Log:
[ROptEst] branch 1.2
+ renamed .filterEargs by .filterEargsWEargList

Modified: branches/robast-1.2/pkg/ROptEst/R/CheckMakeContIC.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/CheckMakeContIC.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/CheckMakeContIC.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -153,7 +153,7 @@
 
 .getG1G2G3Stand <- function(L2deriv, Distr, A.comp, z.comp, w, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         w.fct <- function(x){

Modified: branches/robast-1.2/pkg/ROptEst/R/L1L2normL2deriv.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/L1L2normL2deriv.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/L1L2normL2deriv.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -9,7 +9,7 @@
 setMethod("getL1normL2deriv", signature(L2deriv = "RealRandVariable"),
     function(L2deriv, cent, stand, Distr, normtype, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         integrandG <- function(x, L2, stand, cent){

Modified: branches/robast-1.2/pkg/ROptEst/R/LowerCaseMultivariate.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/LowerCaseMultivariate.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/LowerCaseMultivariate.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -3,7 +3,7 @@
              A.start = NULL, z.comp = NULL, A.comp = NULL, maxiter, tol,
              verbose = NULL, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         if(missing(verbose)|| is.null(verbose))
@@ -106,7 +106,7 @@
              A.start = NULL,  maxiter, tol,
              verbose = NULL, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         if(missing(verbose)|| is.null(verbose))

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfCent.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfCent.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfCent.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -41,7 +41,7 @@
     function(L2deriv, neighbor, biastype, Distr, z.comp, w,
              tol.z = .Machine$double.eps^.5, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         stand <- stand(w)
@@ -70,7 +70,7 @@
     function(L2deriv, neighbor, biastype, Distr, z.comp, w,
              tol.z = .Machine$double.eps^.5, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         integrand1 <- function(x){

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfClip.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfClip.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfClip.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -157,7 +157,7 @@
                                   neighbor = "ContNeighborhood"),
     function(clip, L2deriv, risk, neighbor, biastype, cent,  symm, trafo, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         biastype <- if(sign(risk)==1) positiveBias() else negativeBias()

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfGamma.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfGamma.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfGamma.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -31,7 +31,7 @@
     function(L2deriv, risk, neighbor, biastype, Distr, 
              stand, cent, clip, power = 1L, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         integrandG <- function(x, L2, stand, cent, clip){
@@ -54,7 +54,7 @@
     function(L2deriv, risk, neighbor, biastype, Distr,
              stand, cent, clip, power = 1L, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         integrandG <- function(x, L2, stand, cent, clip){

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfLM.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfLM.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfLM.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -113,7 +113,7 @@
         ### manipulate dots in call -> set control argument for optim
         dots <- list(...)
 
-        dotsI <- .filterEargs(dots)
+        dotsI <- .filterEargsWEargList(dots)
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         if(is.null(dots$method)) dots$method <- "L-BFGS-B"

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asAnscombe.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asAnscombe.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asAnscombe.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -109,7 +109,7 @@
              OptOrIter = "iterate", maxiter, tol, warn,
              verbose = NULL, checkBounds = TRUE, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         if(missing(verbose)|| is.null(verbose))

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asGRisk.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asGRisk.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfRobIC_asGRisk.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -597,7 +597,7 @@
 
 .checkPIC <- function(L2deriv, neighbor, Distr, trafo, z, A, w, z.comp, A.comp, ...){
 
-         dotsI <- .filterEargs(list(...))
+         dotsI <- .filterEargsWEargList(list(...))
          if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
          cat("some check:\n-----------\n")

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfStand.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfStand.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfStand.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -24,7 +24,7 @@
     function(L2deriv, neighbor, biastype, 
              Distr, A.comp, cent, trafo, w, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         w.fct <- function(x){
@@ -54,7 +54,7 @@
                                    neighbor = "ContNeighborhood",
                                    biastype = "onesidedBias"),
     function(L2deriv, neighbor, biastype, clip, cent, trafo, ...){
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
         c1 <- if (sign(biastype)<0) cent - clip else -Inf
         c2 <- if (sign(biastype)>0) cent + clip else Inf

Modified: branches/robast-1.2/pkg/ROptEst/R/getInfV.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/getInfV.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/getInfV.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -33,7 +33,7 @@
     function(L2deriv, neighbor, biastype, Distr, V.comp, 
              cent, stand, w, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         w.fct <- function(x){
@@ -71,7 +71,7 @@
     function(L2deriv, neighbor, biastype, Distr, V.comp,
              cent, stand, w, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         w.fct <- function(x){
@@ -97,7 +97,7 @@
                                    biastype = "onesidedBias"),
     function(L2deriv, neighbor, biastype, clip, cent, stand, ...){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         c1 <- if (sign(biastype)<0) cent - clip else -Inf

Modified: branches/robast-1.2/pkg/ROptEst/R/leastFavorableRadius.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/leastFavorableRadius.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/leastFavorableRadius.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -17,7 +17,7 @@
         if((rho <= 0)||(rho >= 1))
             stop("'rho' not in (0,1)")
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         biastype <- biastype(risk)

Modified: branches/robast-1.2/pkg/ROptEst/R/radiusMinimaxIC.R
===================================================================
--- branches/robast-1.2/pkg/ROptEst/R/radiusMinimaxIC.R	2018-08-15 20:40:56 UTC (rev 1143)
+++ branches/robast-1.2/pkg/ROptEst/R/radiusMinimaxIC.R	2018-08-15 20:45:40 UTC (rev 1144)
@@ -12,7 +12,7 @@
              verbose = NULL, loRad0 = 1e-3, ..., returnNAifProblem = FALSE,
              loRad.s = NULL, upRad.s = NULL, modifyICwarn = NULL){
 
-        dotsI <- .filterEargs(list(...))
+        dotsI <- .filterEargsWEargList(list(...))
         if(is.null(dotsI$useApply)) dotsI$useApply <- FALSE
 
         if(missing(verbose)|| is.null(verbose))



More information about the Robast-commits mailing list