Home
last modified time | relevance | path

Searched refs:FUN (Results 151 – 175 of 3426) sorted by relevance

12345678910>>...138

/dports/www/chromium-legacy/chromium-88.0.4324.182/third_party/ffmpeg/compat/djgpp/
H A Dmath.c21 #define FUN(name, type, op) \ macro
29 FUN(fmin, double, <)
30 FUN(fmax, double, >)
31 FUN(fminf, float, <)
32 FUN(fmaxf, float, >)
/dports/multimedia/handbrake/ffmpeg-4.4/compat/djgpp/
H A Dmath.c21 #define FUN(name, type, op) \ macro
29 FUN(fmin, double, <)
30 FUN(fmax, double, >)
31 FUN(fminf, float, <)
32 FUN(fmaxf, float, >)
/dports/math/slatec/src/
H A Dgaus8.f2 SUBROUTINE GAUS8 (FUN, A, B, ERR, ANS, IERR) argument
79 REAL R1MACH, G8, FUN
91 G8(X,H)=H*((W1*(FUN(X-X1*H) + FUN(X+X1*H))
92 1 +W2*(FUN(X-X2*H) + FUN(X+X2*H)))
93 2 +(W3*(FUN(X-X3*H) + FUN(X+X3*H))
94 3 +W4*(FUN(X-X4*H) + FUN(X+X4*H))))
/dports/databases/grass7/grass-7.8.6/raster/r.terraflow/
H A Dstreamutils.h48 template<class T, class FUN>
53 FUN fmt) { in printStream2Grid()
85 template<class T, class FUN>
89 FUN fmt) { in printGridStream()
119 template<class T, class FUN>
121 removeDuplicates(AMI_STREAM<T> *str, FUN fo) { in removeDuplicates()
146 template<class T, class FUN>
148 removeDuplicatesEx(AMI_STREAM<T> **str, FUN fo) { in removeDuplicatesEx()
162 template<class T, class TT, class FUN>
167 FUN fo) { in mergeStream2Grid()
/dports/devel/R-cran-future/future/R/
H A DfutureCall.R18 futureCall <- function(FUN, args = list(), envir = parent.frame(), lazy = FALSE, seed = FALSE, glob… argument
19 stop_if_not(is.function(FUN))
34 expr <- quote(do.call(what = FUN, args = args))
78 if (!is.element("FUN", names)) globals$FUN <- FUN
83 env <- environment(globals$FUN)
85 environment(globals$FUN) <- env
/dports/math/R/R-4.1.2/src/library/base/R/
H A Douter.R19 outer <- function (X, Y, FUN = "*", ...) argument
40 if (is.character(FUN) && FUN=="*") {
45 FUN <- match.fun(FUN)
52 FUN(X, Y, ...)
/dports/math/libRmath/R-4.1.1/src/library/base/R/
H A Douter.R19 outer <- function (X, Y, FUN = "*", ...) argument
40 if (is.character(FUN) && FUN=="*") {
45 FUN <- match.fun(FUN)
52 FUN(X, Y, ...)
/dports/graphics/mupdf/mupdf-1.18.0-source/platform/java/jni/
H A Dcolorspace.c4 FUN(ColorSpace_finalize)(JNIEnv *env, jobject self) in FUN() function
14 FUN(ColorSpace_getNumberOfComponents)(JNIEnv *env, jobject self) in FUN() function
23 FUN(ColorSpace_nativeDeviceGray)(JNIEnv *env, jobject self) in FUN() function
31 FUN(ColorSpace_nativeDeviceRGB)(JNIEnv *env, jobject self) in FUN() function
39 FUN(ColorSpace_nativeDeviceBGR)(JNIEnv *env, jobject self) in FUN() function
47 FUN(ColorSpace_nativeDeviceCMYK)(JNIEnv *env, jobject self) in FUN() function
/dports/math/R-cran-sets/sets/R/
H A Dconverters.R144 function(x, FUN) argument
147 .make_gset_from_support_and_memberships(FUN(c(names(tab), NA)),
262 FUN <- cset_orderfun(x) functionVar
265 if(is.function(FUN) || is.character(FUN)) {
266 order <- do.call(FUN, list(L))
269 } else if(is.integer(FUN) && (length(L) == length(FUN))) {
270 L <- L[FUN]
271 ms <- ms[FUN]
283 FUN <-
289 x[fun] <- lapply(x[fun], FUN)
/dports/textproc/R-cran-XML/XML/R/
H A DnodeAccessors.R45 function(X, FUN, ...) argument
51 function(X, FUN, ...) argument
57 function(X, FUN, ...) { argument
63 function(X, FUN, ...) argument
65 xmlApply(xmlRoot(X), FUN, ...)
69 function(X, FUN, ...) argument
71 xmlSApply(xmlRoot(X), FUN, ...)
76 function(X, FUN, ...) { argument
81 function(X, FUN, ...) argument
83 xmlSApply(X$children, FUN, ...)
[all …]
/dports/math/R/R-4.1.2/src/library/base/man/
H A DforceAndCall.Rd14 forceAndCall(n, FUN, ...)
18 \item{FUN}{function to call.}
19 \item{\dots}{arguments to \code{FUN}.}
22 \code{forceAndCall} calls the function \code{FUN} with arguments
23 specified in \code{\dots}. If the value of \code{FUN} is a closure
26 the function body. If the value of \code{FUN} is a primitive then
27 the call \code{FUN(\dots)} is evaluated in the usual way.
H A Douter.Rd14 = FUN(X[arrayindex.x], Y[arrayindex.y], \dots)}.
17 outer(X, Y, FUN = "*", \dots)
22 \item{X, Y}{First and second arguments for function \code{FUN}.
24 \item{FUN}{a function to use on the outer products, found \emph{via}
26 \item{\dots}{optional arguments to be passed to \code{FUN}.}
29 \code{X} and \code{Y} must be suitable arguments for \code{FUN}. Each
31 lengths of \code{X} and \code{Y} before \code{FUN} is called.
33 \code{FUN} is called with these two extended vectors as arguments
43 \code{FUN = "*"} is handled as a special case \emph{via}
69 outer(month.abb, 1999:2003, FUN = "paste")
H A Dlapply.Rd14 lapply(X, FUN, \dots)
16 sapply(X, FUN, \dots, simplify = TRUE, USE.NAMES = TRUE)
18 vapply(X, FUN, FUN.VALUE, \dots, USE.NAMES = TRUE)
31 \item{\dots}{optional arguments to \code{FUN}.}
39 of \code{FUN(X[[i]])}.}
45 value from FUN. See \sQuote{Details}.}
59 element of which is the result of applying \code{FUN} to the
96 \code{FUN} are passed through \code{\dots}.
130 \code{FUN.VALUE}. If \code{length(FUN.VALUE) == 1} a
135 \code{\link{dim}(a) == c(dim(FUN.VALUE), length(X))}.
[all …]
/dports/math/libRmath/R-4.1.1/src/library/base/man/
H A DforceAndCall.Rd14 forceAndCall(n, FUN, ...)
18 \item{FUN}{function to call.}
19 \item{\dots}{arguments to \code{FUN}.}
22 \code{forceAndCall} calls the function \code{FUN} with arguments
23 specified in \code{\dots}. If the value of \code{FUN} is a closure
26 the function body. If the value of \code{FUN} is a primitive then
27 the call \code{FUN(\dots)} is evaluated in the usual way.
H A Douter.Rd14 = FUN(X[arrayindex.x], Y[arrayindex.y], \dots)}.
17 outer(X, Y, FUN = "*", \dots)
22 \item{X, Y}{First and second arguments for function \code{FUN}.
24 \item{FUN}{a function to use on the outer products, found \emph{via}
26 \item{\dots}{optional arguments to be passed to \code{FUN}.}
29 \code{X} and \code{Y} must be suitable arguments for \code{FUN}. Each
31 lengths of \code{X} and \code{Y} before \code{FUN} is called.
33 \code{FUN} is called with these two extended vectors as arguments
43 \code{FUN = "*"} is handled as a special case \emph{via}
69 outer(month.abb, 1999:2003, FUN = "paste")
H A Dlapply.Rd14 lapply(X, FUN, \dots)
16 sapply(X, FUN, \dots, simplify = TRUE, USE.NAMES = TRUE)
18 vapply(X, FUN, FUN.VALUE, \dots, USE.NAMES = TRUE)
31 \item{\dots}{optional arguments to \code{FUN}.}
39 of \code{FUN(X[[i]])}.}
45 value from FUN. See \sQuote{Details}.}
59 element of which is the result of applying \code{FUN} to the
96 \code{FUN} are passed through \code{\dots}.
130 \code{FUN.VALUE}. If \code{length(FUN.VALUE) == 1} a
135 \code{\link{dim}(a) == c(dim(FUN.VALUE), length(X))}.
[all …]
/dports/games/openlierox/OpenLieroX/src/breakpad/external/src/common/linux/
H A Dstabs_reader_unittest.input2 FUN 20 21 0x12 not the SO with source file name we expected
6 LSYM 60 61 0x52 not the FUN we're looking for
7 FUN 70 71 0x62 fun1
8 BINCL 80 81 0x72 something to ignore in a FUN body
12 FUN 120 121 0x112 fun2
/dports/math/R-cran-zoo/zoo/inst/doc/
H A Dzoo-read.R41 z <- read.zoo(DF, FUN = function(x)
66 split = 1, index = 2, FUN = f)
83 z <- read.zoo(text = Lines, header = TRUE, index = 1:2, FUN = f)
158 index = 1:2, FUN = f)
167 index = 1:2, FUN = f2)
224 FUN = as.chron)
245 FUN = paste, FUN2 = as.chron)
299 z2 <- read.zoo(text = Lines, header = TRUE, sep = ",", FUN = as.chron)
311 z <- read.zoo(text = Lines, header = TRUE, index = 1:2, FUN = chron)
/dports/math/R-cran-zoo/zoo/R/
H A Drollapply.R48 rollapply.zoo <- function(data, width, FUN, ..., by = 1, argument
60 length(list(...)) < 1 && length(sw <- deparse(substitute(FUN))) == 1) {
69 FUN <- match.fun(FUN)
74 rollapply(data[, j, drop = TRUE], width = width, FUN = FUN, ...,
118 if (all(ix)) FUN(data[posns], ...)
120 FUN(data[replace(posns, !ix, 0)], ...)
132 if (all(ix)) FUN(data[posns,], ...)
134 FUN(data[replace(posns, !ix, 0),], ...)
/dports/finance/R-cran-timeSeries/timeSeries/R/
H A Dbase-applySeries.R28 FUN = colMeans, units = NULL, format = x@format, zone = x@FinCenter, argument
91 fun = match.fun(FUN)
146 function(x, from, to, FUN, ...) argument
161 applySeries(x = x, from = from, to = to, FUN = FUN, ...)
172 FUN = colMeans, units = NULL, ...) argument
182 if (substitute(FUN) == "colMeans") FUN = "colAvgs"
199 fun = match.fun(FUN)
233 function(x, from, to, FUN, ...) argument
283 fun = match.fun(FUN)
/dports/devel/aarch64-none-elf-gcc/gcc-8.4.0/gcc/testsuite/ada/acats/tests/c4/
H A Dc48005a.ada88 FUNCTION FUN (A : INTEGER) RETURN INTEGER IS subprogram
91 END FUN;
92 FUNCTION FUN (A : INTEGER) RETURN RECVAL IS subprogram
96 END FUN;
116 V_A_REC := NEW REC(FUN(2));
/dports/lang/gcc6-aux/gcc-6-20180516/gcc/testsuite/ada/acats/tests/c4/
H A Dc48005a.ada88 FUNCTION FUN (A : INTEGER) RETURN INTEGER IS subprogram
91 END FUN;
92 FUNCTION FUN (A : INTEGER) RETURN RECVAL IS subprogram
96 END FUN;
116 V_A_REC := NEW REC(FUN(2));
/dports/lang/gcc12-devel/gcc-12-20211205/gcc/testsuite/ada/acats/tests/c4/
H A Dc48005a.ada88 FUNCTION FUN (A : INTEGER) RETURN INTEGER IS subprogram
91 END FUN;
92 FUNCTION FUN (A : INTEGER) RETURN RECVAL IS subprogram
96 END FUN;
116 V_A_REC := NEW REC(FUN(2));
/dports/lang/gcc9/gcc-9.4.0/gcc/testsuite/ada/acats/tests/c4/
H A Dc48005a.ada88 FUNCTION FUN (A : INTEGER) RETURN INTEGER IS subprogram
91 END FUN;
92 FUNCTION FUN (A : INTEGER) RETURN RECVAL IS subprogram
96 END FUN;
116 V_A_REC := NEW REC(FUN(2));
/dports/devel/arm-none-eabi-gcc492/gcc-4.9.2/gcc/testsuite/ada/acats/tests/c4/
H A Dc48005a.ada88 FUNCTION FUN (A : INTEGER) RETURN INTEGER IS subprogram
91 END FUN;
92 FUNCTION FUN (A : INTEGER) RETURN RECVAL IS subprogram
96 END FUN;
116 V_A_REC := NEW REC(FUN(2));

12345678910>>...138