[Robast-commits] r752 - in branches/robast-1.0/pkg/ROptEst: R man

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Wed Apr 16 01:14:02 CEST 2014


Author: ruckdeschel
Date: 2014-04-16 01:14:01 +0200 (Wed, 16 Apr 2014)
New Revision: 752

Modified:
   branches/robast-1.0/pkg/ROptEst/R/interpolLM.R
   branches/robast-1.0/pkg/ROptEst/man/internal-interpolate.Rd
Log:
ROptEst:: preparations for evalation of LMs on xi grid for GEVFamilyMuUnknown. 

Modified: branches/robast-1.0/pkg/ROptEst/R/interpolLM.R
===================================================================
--- branches/robast-1.0/pkg/ROptEst/R/interpolLM.R	2014-04-15 23:12:55 UTC (rev 751)
+++ branches/robast-1.0/pkg/ROptEst/R/interpolLM.R	2014-04-15 23:14:01 UTC (rev 752)
@@ -61,7 +61,7 @@
                        maxiter = 50, tol = .Machine$double.eps^0.4,
                        loRad = 0, upRad = Inf, loRad0 = 1e-3,
                        loRad.s=0.2, up.Rad.s=1,
-                       withStartLM = TRUE
+                       withStartLM = TRUE, len = 13
                        ){
    wprint <- function(...){ if (withPrint) print(...)}
    thGrid <- unique(sort(thGrid))
@@ -89,7 +89,7 @@
                print(A.start)
                print(z.start)
                print(c(r.start.l,r.start.u))
-               if(is(a,"try-error")|any(is.na(a))){ a <- rep(NA,13)}else{
+               if(is(a,"try-error")|any(is.na(a))){ a <- rep(NA,len)}else{
                   if(withStartLM){
                      if(itLM==1){
                         z1 <<- a[["a.w"]]
@@ -170,11 +170,11 @@
 
 .generateInterpGrid <- function(thGrid, PFam, toFileCSV = "temp.csv",
             getFun = .getLMGrid, ..., modifyfct, nameInSysdata,
-            GridFileName, withPrint = TRUE){
+            GridFileName, withPrint = TRUE, len = 13){
   if(missing(GridFileName))
      GridFileName <- paste(gsub("^\\.(.+)","\\1",nameInSysdata),".Rdata",sep="")
   Grid <- getFun(thGrid = thGrid, PFam = PFam, ..., modifyfct = modifyfct,
-                 withPrint = withPrint, GridFileName = GridFileName)
+                 withPrint = withPrint, GridFileName = GridFileName, len = len)
   .saveGridToCSV(Grid,toFileCSV,name(PFam),nameInSysdata)
   return(invisible(NULL))
 }

Modified: branches/robast-1.0/pkg/ROptEst/man/internal-interpolate.Rd
===================================================================
--- branches/robast-1.0/pkg/ROptEst/man/internal-interpolate.Rd	2014-04-15 23:12:55 UTC (rev 751)
+++ branches/robast-1.0/pkg/ROptEst/man/internal-interpolate.Rd	2014-04-15 23:14:01 UTC (rev 752)
@@ -38,7 +38,7 @@
            upper = 1e4, lower = 1e-4, OptOrIter = "iterate",
            maxiter = 50, tol = .Machine$double.eps^0.4,
            loRad = 0, upRad = Inf, loRad0 = 1e-3,
-           loRad.s = 0.2, up.Rad.s = 1, withStartLM = TRUE)
+           loRad.s = 0.2, up.Rad.s = 1, withStartLM = TRUE, len = 13)
 
 
 .saveGridToCSV(Grid, toFileCSV, namPFam, nameInSysdata)
@@ -47,7 +47,7 @@
 
 .generateInterpGrid(thGrid, PFam, toFileCSV = "temp.csv",
             getFun = .getLMGrid, ..., modifyfct, nameInSysdata,
-            GridFileName, withPrint = TRUE)
+            GridFileName, withPrint = TRUE, len = 13)
 }
 
 \arguments{
@@ -114,6 +114,7 @@
                 \code{withPrint}; produces the y-values for the
                 interpolation grid. }
   \item{\dots}{further arguments to be passed on to \code{getFun}. }
+  \item{len}{integer; number of Lagrange multipliers to be calibrated. }
 }
 \details{
   \code{.MBRE.th} computes the Lagrange multipliers for the MBRE estimator,



More information about the Robast-commits mailing list