[Robast-commits] r1120 - in branches/robast-1.2/pkg/RobAStBase: R inst man
noreply at r-forge.r-project.org
noreply at r-forge.r-project.org
Sat Aug 11 00:49:40 CEST 2018
Author: ruckdeschel
Date: 2018-08-11 00:49:40 +0200 (Sat, 11 Aug 2018)
New Revision: 1120
Removed:
branches/robast-1.2/pkg/RobAStBase/R/combinedICs.R
Modified:
branches/robast-1.2/pkg/RobAStBase/R/getPIC.R
branches/robast-1.2/pkg/RobAStBase/inst/NEWS
branches/robast-1.2/pkg/RobAStBase/man/ALEstimate-class.Rd
Log:
[RobAstBase] branch 1.2:
only MLEs and CvMMDEs (of class MCEstimate) are automatically cast to ALEstimate / surrogate classes ML.ALEstimate / CvMMD.ALEstimate
i.e., the ".checkEstClassForParamFamily" for MCEstimate is removed / set to trivial identity
Deleted: branches/robast-1.2/pkg/RobAStBase/R/combinedICs.R
===================================================================
--- branches/robast-1.2/pkg/RobAStBase/R/combinedICs.R 2018-08-10 17:48:27 UTC (rev 1119)
+++ branches/robast-1.2/pkg/RobAStBase/R/combinedICs.R 2018-08-10 22:49:40 UTC (rev 1120)
@@ -1,63 +0,0 @@
-################################################################################
-if(FALSE){
-################################################################################
-## 20180809: reverted changes from rev 1110
-################################################################################
-
-combineOrthPICs <- function(pIC1, pIC2, combinedName = "combined IC", dim){
- ## adds to complementary pICs to give one IC
- ## the orthogonality is not checked here
-
- IC <- new(".fastIC")
- IC at name <- combinedName
- pICC1 <- as(diag(dim)%*%pIC1 at Curve,"EuclRandVariable")
- pICC2 <- as(diag(dim)%*%pIC2 at Curve,"EuclRandVariable")
- IC at Curve <- EuclRandVarList(pICC1+pICC2)
- IC at Risks <- pIC1 at Risks
- if(length(pIC2 at Risks)) addRisk(IC) <- pIC2 at Risks
- IC at Infos <- pIC1 at Infos
- if(nrow(pIC2 at Infos)) addInfo(IC) <- pIC2 at Infos
- IC at CallL2Fam <- pIC1 at CallL2Fam
- .modifyIC.0 <- function(L2Fam, IC, withMakeIC = FALSE){
- pic1 <- pic1 at modifyIC(L2Fam, pIC1, withMakeIC)
- pic2 <- pic2 at modifyIC(L2Fam, pIC2, withMakeIC)
- IC1 <- combineOrthPICs(pic1, pic2,combinedName)
- return(IC1)
- }
- .modifyIC.1 <- function(L2Fam, IC, withMakeIC = FALSE){
- IC1 <- .modifyIC.0(L2Fam, IC, withMakeIC)
- IC1 at modifyIC <- .modifyIC.1
- return(IC1)
- }
-
- IC at modifyIC <- .modifyIC.1
- IC at .fastFct <- function(x){pIC1 at .fastFct(x)+pIC2 at .fastFct(x)}
- return(IC)
-}
-
-
-.fastIC <- function(name ="", Curve = EuclRandVarList(RealRandVariable(Map = list(function(x){x}),
- Domain = Reals())), Risks, Infos, CallL2Fam = call("L2ParamFamily"),
- modifyIC = NULL, .fastFct = NULL){
-fastIC <- new(".fastIC")
-if(missing(Infos)) Infos <- fastIC at Infos
-if(missing(Risks)) Risks <- fastIC at Risks
-IC.0 <- IC(name, Curve, Risks, Infos, CallL2Fam, modifyIC)
-slotNms <- slotNames(class(IC.0))
-for(sN in slotNms) slot(fastIC, sN) <- slot(IC.0,sN)
-if(is.null(.fastFct)||missing(.fastFct)){
- ICM <- IC.0 at Curve[[1]]@Map
- .fastFct <- function(x){
- if(is.null(dim(x)))
- sapply(x, function(u) sapply(ICM, function(s)s(u)))
- else
- apply(x, 1,function(u) sapply(ICM, function(s)s(u)))
- }
-}
-fastIC at .fastFct <- .fastFct
-return(fastIC)
-}
-################################################################################
-## end if(FALSE)
-################################################################################
-}
\ No newline at end of file
Modified: branches/robast-1.2/pkg/RobAStBase/R/getPIC.R
===================================================================
--- branches/robast-1.2/pkg/RobAStBase/R/getPIC.R 2018-08-10 17:48:27 UTC (rev 1119)
+++ branches/robast-1.2/pkg/RobAStBase/R/getPIC.R 2018-08-10 22:49:40 UTC (rev 1120)
@@ -3,10 +3,10 @@
function(PFam, estimator)estimator)
+#setMethod(".checkEstClassForParamFamily",
+# signature=signature(PFam="ANY",estimator="MCEstimate"),
+# function(PFam, estimator) .extendbyPIC(PFam, estimator, "MCALEstimate"))
setMethod(".checkEstClassForParamFamily",
- signature=signature(PFam="ANY",estimator="MCEstimate"),
- function(PFam, estimator) .extendbyPIC(PFam, estimator, "MCALEstimate"))
-setMethod(".checkEstClassForParamFamily",
signature=signature(PFam="ANY",estimator="MLEstimate"),
function(PFam, estimator) .extendbyPIC(PFam, estimator, "ML.ALEstimate"))
setMethod(".checkEstClassForParamFamily",
Modified: branches/robast-1.2/pkg/RobAStBase/inst/NEWS
===================================================================
--- branches/robast-1.2/pkg/RobAStBase/inst/NEWS 2018-08-10 17:48:27 UTC (rev 1119)
+++ branches/robast-1.2/pkg/RobAStBase/inst/NEWS 2018-08-10 22:49:40 UTC (rev 1120)
@@ -50,6 +50,10 @@
* "( mu = model distr. )" => this uses .CvMMDCovariance with no argument mu
* "( mu = <muname> )" => this uses .CvMMDCovariance with argument mu
to get the pIC
++ only MLEs and CvMMDEs (of class MCEstimate) are automatically cast to ALEstimate
+ / surrogate classes ML.ALEstimate / CvMMD.ALEstimate
+ i.e., the ".checkEstClassForParamFamily" for MCEstimate is removed
+ / set to trivial identity
+ force optimal ICs to respect the support of the model distribution
careful testing gave: during evaluation of kStepEstimator it is
prohibitive to put line liesInSupport in each of the coordinate functions
Modified: branches/robast-1.2/pkg/RobAStBase/man/ALEstimate-class.Rd
===================================================================
--- branches/robast-1.2/pkg/RobAStBase/man/ALEstimate-class.Rd 2018-08-10 17:48:27 UTC (rev 1119)
+++ branches/robast-1.2/pkg/RobAStBase/man/ALEstimate-class.Rd 2018-08-10 22:49:40 UTC (rev 1120)
@@ -18,7 +18,8 @@
\alias{confint,ALEstimate,symmetricBias-method}
\alias{confint,ALEstimate,onesidedBias-method}
\alias{confint,ALEstimate,asymmetricBias-method}
-\alias{.checkEstClassForParamFamily,ANY,MCEstimate-method}
+\alias{.checkEstClassForParamFamily,ANY,MLEstimate-method}
+\alias{.checkEstClassForParamFamily,ANY,CvMMDEstimate-method}
\alias{getPIC}
\alias{getPIC,ANY-method}
\alias{getPIC,MLEstimate-method}
More information about the Robast-commits
mailing list