Home
last modified time | relevance | path

Searched refs:wgtFUN (Results 1 – 12 of 12) sorted by relevance

/dports/math/R-cran-robustbase/robustbase/R/
H A Dcomedian.R38 wgtFUN = control$ wgtFUN, argument
47 if(is.character(wgtFUN))
48 wgtFUN <- .wgtFUN.covComed[[wgtFUN]](p=p, n=n, control)
49 if(!is.function(wgtFUN))
77 weights <- wgtFUN(mah)
83 wgtFUN(mah)
88 wgtFUN=wgtFUN), nameattr
H A Drrcov.control.R27 trace = FALSE, wgtFUN = "01.original", beta, argument
28 use.correction = identical(wgtFUN, "01.original"),
37 trace=trace, wgtFUN=wgtFUN, beta=beta, nameattr
H A DcovMcd.R47 wgtFUN = control$ wgtFUN, argument
65 if(missing(wgtFUN)) getDefCtrl("wgtFUN", defCtrl)
108 if(is.character(wgtFUN)) {
109 if(is.function(mkWfun <- .wgtFUN.covMcd[[wgtFUN]]))
110 wgtFUN <- mkWfun(p=p, n=n, control)
112 if(!is.function(wgtFUN))
146 weights <- wgtFUN(mah) # 0/1
161 weights <- wgtFUN(mah) # 0/1
258 weights <- wgtFUN(((x - center)/scale)^2)
316 weights <- wgtFUN(mah)
[all …]
H A DltsReg.R100 wgtFUN = control$ wgtFUN, argument
125 if(missing(wgtFUN)) getDefCtrl("wgtFUN", defCtrl)
142 if(is.character(wgtFUN)) {
143 switch(wgtFUN,
146 wgtFUN <- function(r) as.numeric(abs(r) <= cW)
148 stop("unknown 'wgtFUN' specification: ", wgtFUN))
149 } else if(!is.function(wgtFUN))
274 weights <- wgtFUN(resid/ans$scale)
344 weights <- wgtFUN(ans$resid)
403 ans$raw.weights[ok] <- weights <- wgtFUN(resid/s0)
[all …]
/dports/math/R-cran-robustbase/robustbase/man/
H A DcovComed.Rd7 \alias{.wgtFUN.covComed}
17 trace = control$trace, wgtFUN = control$wgtFUN,
33 \item{wgtFUN}{a character string or \code{\link{function}}, specifying
35 \code{wgtFUN = "01.original"} corresponds to 0-1 weights as proposed
37 experimental, see the experimental \code{.wgtFUN.covComed} object.}
86 ## List of experimental pre-specified wgtFUN() creators:
88 str(.wgtFUN.covComed)
H A Drrcov.control.Rd14 wgtFUN = "01.original", beta,
15 use.correction = identical(wgtFUN, "01.original"),
49 \item{wgtFUN}{a character string or \code{\link{function}}, specifying
54 string specifications need to match \code{names(.wgtFUN.covComed)} -
57 \code{wgtFUN}s, see e.g., \code{\link{.wgtFUN.covMcd}} and
58 \code{\link{.wgtFUN.covComed}}.}
H A DcovMcd.Rd9 \alias{.wgtFUN.covMcd}
24 use.correction =, wgtFUN =, control = rrcov.control())
83 \item{wgtFUN}{a character string or \code{\link{function}}, specifying
86 now specified by \code{wgtFUN = "01.original"} (or via
89 see the experimental \code{.wgtFUN.covMcd} object.}
136 \code{wgtFUN()}: Martin Maechler
227 ## List of experimental pre-specified wgtFUN() creators:
229 str(.wgtFUN.covMcd)
231 cMM <- covMcd(hbk.x, wgtFUN = "sm1.adaptive")
H A DltsReg.Rd21 seed = , trace = , use.correction = , wgtFUN = , control = rrcov.control(),
82 \item{wgtFUN}{a character string or \code{\link{function}}, specifying
85 (1999), now specified by \code{wgtFUN = "01.original"} (or via \code{control}).}
/dports/math/R-cran-robustbase/robustbase/
H A DNAMESPACE75 smoothWgt, .wgtFUN.covMcd, .wgtFUN.covComed,
/dports/math/R-cran-robustbase/robustbase/po/
H A DR-de.po222 msgid "'wgtFUN' must be a function or a string specifying such a function"
249 msgid "'wgtFUN' must be a function or one of the strings %s."
864 msgid "unknown 'wgtFUN' specification:"
867 msgid "'wgtFUN' must be a function or a string specifying one"
H A DR-robustbase.pot220 msgid "'wgtFUN' must be a function or a string specifying such a function"
247 msgid "'wgtFUN' must be a function or one of the strings %s."
829 msgid "unknown 'wgtFUN' specification:"
832 msgid "'wgtFUN' must be a function or a string specifying one"
/dports/math/R-cran-robustbase/robustbase/inst/
H A DNEWS.Rd380 Stick} --- to be used as \code{wgtFUN} option for \code{covMcd()}