Home
last modified time | relevance | path

Searched refs:deviance (Results 1 – 25 of 702) sorted by relevance

12345678910>>...29

/dports/math/R-cran-NMF/NMF/man/
H A Ddeviance.Rd2 \name{deviance}
3 \alias{deviance}
4 \alias{deviance-methods}
5 \alias{deviance,NMFfit-method}
6 \alias{deviance,NMFfitX-method}
7 \alias{deviance,NMF-method}
8 \alias{deviance,NMFStrategy-method}
12 deviance(object, ...)
14 \S4method{deviance}{NMF}(object, y,
32 function to use to compute the deviance. In
[all …]
/dports/games/netradiant/netradiant-20150621-src/tools/quake3/q3map2/q3map2_fsr_newfiles/
H A Dq3map2_fsr_svn158.patch8 /* ydnar: get deviance and samples */
10 deviance = FloatForKey( e, "_deviance" );
11 if( deviance == 0.0f )
12 deviance = FloatForKey( e, "_deviation" );
13 if( deviance == 0.0f )
14 deviance = FloatForKey( e, "_jitter" );
16 + numSamples = max(IntForKey( e, "_samples" ), deviance);
17 if( deviance < 0.0f || numSamples < 1 )
19 deviance = 0.0f;
/dports/math/R-cran-VGAM/VGAM/R/
H A Ddeviance.vlm.q10 deviance.vlm <- function(object,
14 object@criterion$deviance
21 "'deviance' slot of the object.")
37 deviance.vglm <- function(object,
40 object@criterion$deviance
52 if (!isGeneric("deviance"))
54 standardGeneric("deviance"))
58 deviance.vlm(object, ...))
63 deviance.vglm(object, ...))
74 deviance.qrrvglm <- function(object,
[all …]
H A Dprint.vlm.q34 if (length(deviance(object)) &&
35 is.finite(deviance(object)))
36 cat("Deviance:", format(deviance(object)), "\n")
79 if (length(deviance(x)) &&
80 is.finite(deviance(x)))
81 cat("Deviance:", format(deviance(x)), "\n")
H A Dprint.vglm.q159 if (length(deviance(object)))
160 cat("Residual deviance:", format(deviance(object)), "\n")
229 if (length(deviance(object)))
230 cat("Residual deviance:", format(deviance(object)), "\n")
240 ii != "deviance")
291 if (length(deviance(object)))
292 cat("Residual deviance:", format(deviance(object)), "\n")
H A Danova.vglm.q125 has.deviance <- !is.null(dev.object <- deviance(object)) && trydev
149 .has.deviance = has.deviance,
212 object.null.deviance <- fit0$crit.list$deviance
292 resdev <- c(object.null.deviance, resdev, deviance(object))
301 if (has.deviance) {
311 col2 = pmax(0, resdev - deviance(object)),
357 if (!has.deviance)
375 .has.deviance = FALSE, argument
424 if (.has.deviance && .trydev)
428 table <- if (.has.deviance)
[all …]
/dports/devel/R-cran-glmnet/glmnet/man/
H A Ddeviance.glmnet.Rd1 \name{deviance.glmnet}
2 \alias{deviance.glmnet}
3 \title{Extract the deviance from a glmnet object}
5 Compute the deviance sequence from the glmnet object
8 \method{deviance}{glmnet}(object,...)
16 …The former is the fraction of (null) deviance explained. The deviance calculations incorporate wei…
17 present in the model. The deviance is defined to be 2*(loglike_sat -
20 Null deviance is defined to
23 dev.ratio=1-deviance/nulldev, and this
24 \code{deviance} method returns (1-dev.ratio)*nulldev.
[all …]
/dports/math/R-cran-lme4/lme4/tests/
H A DREMLdev.R5 deviance(fm1ML)
6 deviance(fm1,REML=FALSE) ## FIXME: not working yet (NA)
7 deviance(fm1,REML=TRUE)
13 … all.equal(REMLcrit(fm1),deviance(fm1,REML=TRUE),deviance(fm1ML,REML=TRUE),oldvals["REML"]),
14 all.equal(deviance(fm1ML),deviance(fm1ML,REML=FALSE),oldvals["ML"]),
16 all.equal(deviance(fm1ML)/-2,c(logLik(fm1ML,REML=FALSE)),
/dports/math/R-cran-memisc/memisc/R/
H A Dxx-getSummary.R31 deviance <- deviance(obj) functionVar
43 deviance = deviance, nameattr
81 LR <- smry$null.deviance - smry$deviance
85 deviance <- deviance(obj) functionVar
92 McFadden <- 1- smry$deviance/smry$null.deviance
114 deviance = deviance, nameattr
H A Dyy-mtable-ext-DaveAtkins.R37 LR <- smry$null.deviance - smry$deviance
41 deviance <- deviance(obj) functionVar
47 McFadden <- 1 - smry$deviance/smry$null.deviance
69 deviance = deviance, nameattr
H A Dyy-mtable-ext-ChristopherNLawrence.R34 LR <- deviance(null.model) - deviance(obj)
38 dev <- deviance(obj)
42 L0.pwr <- exp(-deviance(null.model)/N)
46 McFadden <- 1 - dev/deviance(null.model)
67 deviance = dev, nameattr
H A Dyz-getSummary-merMod.R80 deviance <- deviance(obj) functionVar
82 deviance <- lme4::REMLcrit(obj)
90 deviance = deviance, nameattr
/dports/math/R/R-4.1.2/src/library/stats/man/
H A Ddeviance.Rd1 % File src/library/stats/man/deviance.Rd
6 \name{deviance}
7 \alias{deviance}
10 Returns the deviance of a fitted model object.
13 deviance(object, \dots)
16 \item{object}{an object for which the deviance is desired.}
25 The value of the deviance extracted from the object \code{object}.
H A Danova.glm.Rd13 Compute an analysis of deviance table for one or more generalized
27 Specifying a single object gives a sequential analysis of deviance
28 table for that fit. That is, the reductions in the residual deviance
33 residual degrees of freedom and deviance for each model.
35 deviance is also given. (This only makes statistical sense if the
40 comparing the reduction in deviance for the row to the residuals.
46 deviance plus twice the estimate of \eqn{\sigma^2} times
57 the residual deviance in the analysis of deviance table shown.
/dports/math/libRmath/R-4.1.1/src/library/stats/man/
H A Ddeviance.Rd1 % File src/library/stats/man/deviance.Rd
6 \name{deviance}
7 \alias{deviance}
10 Returns the deviance of a fitted model object.
13 deviance(object, \dots)
16 \item{object}{an object for which the deviance is desired.}
25 The value of the deviance extracted from the object \code{object}.
H A Danova.glm.Rd13 Compute an analysis of deviance table for one or more generalized
27 Specifying a single object gives a sequential analysis of deviance
28 table for that fit. That is, the reductions in the residual deviance
33 residual degrees of freedom and deviance for each model.
35 deviance is also given. (This only makes statistical sense if the
40 comparing the reduction in deviance for the row to the residuals.
46 deviance plus twice the estimate of \eqn{\sigma^2} times
57 the residual deviance in the analysis of deviance table shown.
/dports/misc/actiona/actiona-3.10.1/actiontools/qtimagefilters/
H A Dgaussfilter.h104 static qreal Gauss2DFunction(int x, int y, qreal deviance) in Gauss2DFunction() argument
115 return exp(-(x*x + y*y)/(2*deviance*deviance))/(2*M_PI*deviance*deviance); in Gauss2DFunction()
129 double deviance = sqrt(-m_radius*m_radius/(2*log(1/255.0))); in apply() local
133 matLeft.setData(uRadius + x, 0, Gauss2DFunction(x, 0, deviance)); in apply()
/dports/math/py-statsmodels/statsmodels-0.13.1/statsmodels/genmod/tests/results/
H A Dresults_glm.py316 self.deviance = 8.68876986288542e-05
622 self.deviance = 4078.76541772
728 self.deviance = 201.4479911325021
793 self.deviance = 0.087388516417
946 self.deviance = 16.174635536991005
1085 self.deviance = 15.093762327607557
1128 self.deviance = 18.591641759528944
1209 self.deviance = 1423.943980407997
2253 self.deviance = 304.27188306012789
3013 self.deviance = 305.33661191013988
[all …]
/dports/devel/R-cran-broom/broom/man/
H A Dglance.ergm.Rd7 \method{glance}{ergm}(x, deviance = FALSE, mcmc = FALSE, ...)
12 \item{deviance}{Logical indicating whether or not to report null and
13 residual deviance for the model, as well as degrees of freedom. Defaults
30 If \code{deviance = TRUE}, and if the model supports it, the
32 \item{null.deviance}{The null deviance of the model}
33 \item{df.null}{The degrees of freedom of the null deviance}
34 \item{residual.deviance}{The residual deviance of the model}
35 \item{df.residual}{The degrees of freedom of the residual deviance}
/dports/math/py-statsmodels/statsmodels-0.13.1/examples/python/
H A Dglm_weights.py259 np.column_stack([[r.llf, r.deviance, r.pearson_chi2]
285 res_o2.pearson_chi2 - res_o.pearson_chi2, res_o2.deviance - res_o.deviance, res_o2.llf - res_o.llf
295 res_f2.pearson_chi2 - res_f.pearson_chi2, res_f2.deviance - res_f.deviance, res_f2.llf - res_f.llf
309 res_e2.pearson_chi2 - res_e.pearson_chi2, res_e2.deviance - res_e.deviance, res_e2.llf - res_e.llf
318 res_a2.pearson_chi2 - res_a.pearson_chi2, res_a2.deviance - res_a.deviance, res_a2.llf - res_a.llf
/dports/math/R-cran-pbkrtest/pbkrtest/man/
H A Ddevfun_vp.Rd12 \item{devfun}{deviance function as a function of theta only.}
14 \item{reml}{if \code{TRUE} the REML deviance is computed;
15 if \code{FALSE}, the ML deviance is computed.}
18 the REML or ML deviance.
/dports/math/R-cran-nnls/nnls/R/
H A Dnnls.R24 nnls.out <- list(x=sol$X, deviance=sol$RNORM^2, nameattr
56 nnnpls.out <- list(x=sol$X, deviance=sol$RNORM^2, nameattr
67 cat("residual sum-of-squares: ", format(x$deviance, digits = digits),
81 cat("residual sum-of-squares: ", format(x$deviance, digits = digits),
94 deviance.nnls <- deviance.nnnpls <- function(object, ...) object$deviance
/dports/math/py-statsmodels/statsmodels-0.13.1/statsmodels/duration/tests/results/
H A Dkm_cox1.do34 * predict predictall, hr xb stdp basesurv basechazard basehc mgale csnell deviance ldisplace lmax e…
36 >>> for i in 'hr xb stdp basesurv basechazard basehc mgale csnell deviance ldisplace lmax effects'.…
46 predict deviance, deviance
51 outsheet hr xb stdp basesurv basechazard basehc mgale csnell deviance ldisplace lmax using "surv_co…
/dports/devel/R-cran-broom/broom/tests/testthat/
H A Dtest-ergm.R45 gl <- glance(gest, deviance = TRUE)
46 gl2 <- glance(gest3, deviance = TRUE, mcmc = TRUE)
48 gl3 <- glance(gest, deviance = TRUE, mcmc = TRUE)
/dports/math/R-cran-lme4/lme4/man/
H A Ddevcomp.Rd3 \title{Extract the deviance component list}
13 \item{cmp}{a named numeric vector of components of the deviance}
16 Return the deviance component list

12345678910>>...29