Home
last modified time | relevance | path

Searched defs:newuoa (Results 1 – 7 of 7) sorted by relevance

/dports/science/cp2k/cp2k-2e995eec7fd208c8a72d9544807bd8b8ba8cd1cc/src/common/
H A Dpowell.F107 SUBROUTINE newuoa(n, x, optstate) subroutine
109 INTEGER :: n local
110 REAL(dp), DIMENSION(*) :: x local
111 TYPE(opt_state_type) :: optstate
113 … INTEGER :: ibmat, id, ifv, igq, ihq, ipq, ivl, iw, &
114 ixb, ixn, ixo, ixp, izmat, maxfun, &
115 ndim, np, npt, nptm
116 REAL(dp) :: rhobeg, rhoend
/dports/science/cp2k-data/cp2k-7.1.0/src/common/
H A Dpowell.F107 SUBROUTINE newuoa(n, x, optstate) subroutine
109 INTEGER :: n local
110 REAL(dp), DIMENSION(*) :: x local
111 TYPE(opt_state_type) :: optstate
113 … INTEGER :: ibmat, id, ifv, igq, ihq, ipq, ivl, iw, &
114 ixb, ixn, ixo, ixp, izmat, maxfun, &
115 ndim, np, npt, nptm
116 REAL(dp) :: rhobeg, rhoend
/dports/math/R-cran-nloptr/nloptr/src/nlopt_src/
H A DMakefile.am11 SUBDIRS = util direct cdirect $(CXX_DIRS) praxis luksan crs mlsl mma cobyla newuoa neldermead augla… subdir
/dports/math/R-cran-nloptr/nloptr/R/
H A Dcobyla.R222 function(x0, fn, nl.info = FALSE, control = list(), ...)
/dports/math/R-cran-minqa/minqa/R/
H A Dminqa.R170 newuoa <- function(par, fn, control = list(), ...) function
/dports/math/R-cran-nloptr/nloptr/src/nlopt_src/newuoa/
H A Dnewuoa.c2472 nlopt_result newuoa(int n, int npt, double *x, in newuoa() function
/dports/math/nlopt/nlopt-2.7.1/src/algs/newuoa/
H A Dnewuoa.c2490 nlopt_result newuoa(int n, int npt, double *x, in newuoa() function