Home
last modified time | relevance | path

Searched refs:tet0 (Results 1 – 18 of 18) sorted by relevance

/dports/finance/R-cran-gmm/gmm/R/
H A DgetModel.R281 if (is.null(names(object$tet0)))
287 restTet <- object$tet0[object$eqConst]
288 obj$tet0 <- object$tet0[-object$eqConst]
317 if (is.null(object$tet0))
367 if (is.null(object$tet0))
370 k <- length(object$tet0)
378 if(is.null(names(object$tet0)))
467 if (is.null(object$tet0))
475 tet0 <- c(tet0, colMeans(dat$x[,3:(k+1),drop=FALSE]))
476 names(tet0) <- NULL
[all …]
H A Dgel.R363 gel <- function(g, x, tet0 = NULL, gradv = NULL, smooth = FALSE, argument
386 all_args <- list(g = g, x = x, tet0 = tet0, gradv = gradv, smooth = smooth, nameattr
405 evalGel <- function(g, x, tet0, gradv = NULL, smooth = FALSE, argument
424 all_args <- list(g = g, x = x, tet0 = tet0, gradv = gradv, smooth = smooth, nameattr
H A DmomentEstim.R43 tet0 <- .getThetaList(res0$par, dat) functionVar
45 w <- .weightFct_Sys(tet=tet0, dat=dat, type=object$vcov)
57 z$initTheta <- tet0
739 res <- optim(P$tet0, .thetf, P = P, l0Env = l0Env, ...)
741 res <- nlminb(P$tet0, .thetf, P = P, l0Env = l0Env, ...)
744 res <- optimize(.thetf, P$tet0, P = P, l0Env = l0Env, ...)
751 res <- constrOptim(P$tet0, .thetf, grad = NULL, P = P, l0Env = l0Env, ...)
847 res <- optim(P$tet0, .thetf, P = P, l0Env = l0Env, ...)
852 res <- optimize(.thetf, P$tet0, P = P, l0Env = l0Env, ...)
858 res <- constrOptim(P$tet0, .thetf, grad = NULL, P = P,l0Env = l0Env, ...)
[all …]
H A Dategel.R1 ATEgel <- function(g, balm, w=NULL, y=NULL, treat=NULL, tet0=NULL, argument
18 all_args <- list(g = g, x = balm, w=w, y=y, treat=treat, tet0 = tet0, type = type, nameattr
H A DMethods.gel.R62 argCall$tet0 <- object$coefficients
63 argCall$tet0[which] <- coef
/dports/finance/R-cran-gmm/gmm/inst/doc/
H A Dgmm_with_R.R215 tet0 <- c(res_0$coef, var(residuals(res_0)), 0) vector
216 names(tet0) <- c("alpha", "beta", "sigma^2", "gamma")
217 res_rf <- gmm(g6, rf, tet0, control = list(maxit = 1000, reltol = 1e-10))
246 tet0 <- c(mu = mean(x1), sig = sd(x1)) vector
247 res_el <- gel(g1,x1,tet0)
251 res_et <- gel(g1,x1,tet0,type="ET")
255 res_cue <- gel(g1,x1,tet0,type="CUE")
263 tet0 <- gmm(g4,x=x5t[,4:7],wmatrix="ident")$coef globalVar
264 res <- gel(g4,x=x5t[,4:7],tet0,smooth=TRUE,kernel="Truncated")
H A Dgmm_with_R.rnw594 tet0 <- c(res_0$coef, var(residuals(res_0)), 0)
595 names(tet0) <- c("alpha", "beta", "sigma^2", "gamma")
746 tet0 <- c(mu = mean(x1), sig = sd(x1))
747 res_el <- gel(g1,x1,tet0)
754 res_et <- gel(g1,x1,tet0,type="ET")
758 res_cue <- gel(g1,x1,tet0,type="CUE")
790 tet0 <- gmm(g4,x=x5t[,4:7],wmatrix="ident")$coef
791 res <- gel(g4,x=x5t[,4:7],tet0,smooth=TRUE,kernel="Truncated")
811 res <- gel(g4,x=dat5[,4:7],tet0,smooth=TRUE,kernel="Truncated",
818 res <- gel(g4,x=dat5[,4:7],tet0,smooth=TRUE, optlam="optim")
[all …]
/dports/finance/R-cran-fBasics/fBasics/R/
H A Dbuiltin-gelGmm.R200 function(g,x,tet0,gradv=NULL,smooth=FALSE,type=c("EL","ET","CUE","ETEL"), argument
225 k <- length(tet0)
269 n = nrow(g(tet0,x))
274 rgmm <- .gmm(g,x,tet0,wmatrix="ident")
335 res <- optim(tet0,thetf,...)
338 res <- optimize(thetf,tet0,...)
343 res <- constrOptim(tet0,thetf,...)
/dports/finance/R-cran-gmm/gmm/man/
H A Dgel.Rd12 gel(g, x, tet0 = NULL, gradv = NULL, smooth = FALSE,
22 evalGel(g, x, tet0, gradv = NULL, smooth = FALSE,
34 \item{tet0}{A \eqn{k \times 1} vector of starting values. If the
36 linear case, if tet0=NULL, the 2-step gmm estimator is used as starting
H A DATEgel.Rd13 ATEgel(g, balm, w=NULL, y=NULL, treat=NULL, tet0=NULL,momType=c("bal","balSample","ATT"),
46 \item{tet0}{A \eqn{3 \times 1} vector of starting values. If not
/dports/science/apbs/apbs-pdb2pqr-apbs-1.5-102-g500c1473/apbs/externals/fetk/gamer/src/biom/
H A DReadWriteMesh.C802 int tet0, tet1, tet2; in GemMesh_fromTetgen() local
826 tet0 = tetio.adjtetlist[i*2]-1; in GemMesh_fromTetgen()
828 tet2 = (tet0 == -2) ? tet1 : ((tet1 == -2) ? tet0 : -2); in GemMesh_fromTetgen()
/dports/finance/R-cran-gmm/gmm/vignettes/
H A Dgmm_with_R.rnw594 tet0 <- c(res_0$coef, var(residuals(res_0)), 0)
595 names(tet0) <- c("alpha", "beta", "sigma^2", "gamma")
746 tet0 <- c(mu = mean(x1), sig = sd(x1))
747 res_el <- gel(g1,x1,tet0)
754 res_et <- gel(g1,x1,tet0,type="ET")
758 res_cue <- gel(g1,x1,tet0,type="CUE")
790 tet0 <- gmm(g4,x=x5t[,4:7],wmatrix="ident")$coef
791 res <- gel(g4,x=x5t[,4:7],tet0,smooth=TRUE,kernel="Truncated")
811 res <- gel(g4,x=dat5[,4:7],tet0,smooth=TRUE,kernel="Truncated",
818 res <- gel(g4,x=dat5[,4:7],tet0,smooth=TRUE, optlam="optim")
[all …]
/dports/astro/swe/swisseph-2.10.1/
H A Dswevents.c274 static int32 get_next_voc(double tet0, int32 iflag, int32 vocmethod, VOC *pvoc, char *serr);
2702 static int32 get_sign_ingress_direct_body(double tet0, int32 ipl, int32 iflag, int32 backward, doub… in get_sign_ingress_direct_body() argument
2706 if (swe_calc(tet0, ipl, iflag, xx, serr) == ERR) in get_sign_ingress_direct_body()
2719 t = tet0; in get_sign_ingress_direct_body()
2782 static int32 get_next_voc(double tet0, int32 iflag, int32 vocmethod, VOC *pvoc, char *serr) in get_next_voc() argument
2792 …if ((retc = get_sign_ingress_direct_body(tet0, SE_MOON, iflag, 0, &(tret[1]), &isign, serr)) == ER… in get_next_voc()
2826 …if ((retc = get_sign_ingress_direct_body(tet0, SE_MOON, iflag, 1, &tingr_prev, &isign, serr)) == E… in get_next_voc()
/dports/cad/gmsh/gmsh-4.9.2-source/contrib/hxt/tetMesh/src/
H A DHXTSPR.c1751 uint64_t tet0 = newTet[adj0/4]; in rebuildMesh() local
1753 setFacetConstraint(mesh, tet0, facet0); in rebuildMesh()
1759 mesh->tetrahedra.neigh[4*tet0 + facet0] = 4*tet1 + facet1; in rebuildMesh()
1760 mesh->tetrahedra.neigh[4*tet1 + facet1] = 4*tet0 + facet0; in rebuildMesh()
/dports/chinese/scim-tables/scim-tables-0.5.10/tables/zh/
H A DEZ-Big.txt.in102639 tet0 藤蘿
102640 tet0 藜藿
/dports/textproc/scim-table-imengine/scim-tables-0.5.10/tables/zh/
H A DEZ-Big.txt.in102639 tet0 藤蘿
102640 tet0 藜藿
/dports/japanese/scim-tables/scim-tables-0.5.10/tables/zh/
H A DEZ-Big.txt.in102639 tet0 藤蘿
102640 tet0 藜藿
/dports/korean/scim-tables/scim-tables-0.5.10/tables/zh/
H A DEZ-Big.txt.in102639 tet0 藤蘿
102640 tet0 藜藿