Home
last modified time | relevance | path

Searched refs:FUN (Results 76 – 100 of 3426) sorted by relevance

12345678910>>...138

/dports/math/R-cran-sets/sets/R/
H A Douter.R2 function(X, Y, FUN = "*", ..., SIMPLIFY = TRUE, quote = FALSE) argument
10 FUN <- Y
15 FUN <- match.fun(FUN)
26 ret <- mapply(FUN, xrep, yrep, MoreArgs = list(...), SIMPLIFY = FALSE)
40 function(X, Y, FUN = "*", ..., SIMPLIFY = TRUE, quote = FALSE) argument
41 set_outer(X = X, Y = Y, FUN = FUN, ..., SIMPLIFY = SIMPLIFY, quote = quote)
/dports/finance/R-cran-quantmod/quantmod/R/
H A DnewTA.R1 `newTA` <- function(FUN, preFUN, postFUN, on=NA, yrange=NULL, argument
3 if(is.character(FUN)) {
4 if(exists(FUN) && is.function(get(FUN))) {
5 FUN.name <- FUN
6 FUN <- get(FUN)
9 if(is.function(FUN)) {
10 FUN.name <- deparse(substitute(FUN))
31 .formals <- formals(FUN)[-data.at]
94 .body[5] <- paste("x <-",funToFun(FUN,FUN.name,data.at, dots=fdots))
107 FUN <- "" functionVar
/dports/math/R/R-4.1.2/src/library/base/R/
H A Dsapply.R62 sapply <- function(X, FUN, ..., simplify = TRUE, USE.NAMES = TRUE) argument
64 FUN <- match.fun(FUN)
65 answer <- lapply(X = X, FUN = FUN, ...)
73 vapply <- function(X, FUN, FUN.VALUE, ..., USE.NAMES = TRUE) argument
75 FUN <- match.fun(FUN)
77 .Internal(vapply(X, FUN, FUN.VALUE, USE.NAMES))
/dports/math/libRmath/R-4.1.1/src/library/base/R/
H A Dsapply.R62 sapply <- function(X, FUN, ..., simplify = TRUE, USE.NAMES = TRUE) argument
64 FUN <- match.fun(FUN)
65 answer <- lapply(X = X, FUN = FUN, ...)
73 vapply <- function(X, FUN, FUN.VALUE, ..., USE.NAMES = TRUE) argument
75 FUN <- match.fun(FUN)
77 .Internal(vapply(X, FUN, FUN.VALUE, USE.NAMES))
/dports/devel/R-cran-future.apply/future.apply/R/
H A Dfuture_mapply.R45 future_mapply <- function(FUN, ..., MoreArgs = NULL, SIMPLIFY = TRUE, USE.NAMES = TRUE, future.envi… argument
49 FUN <- match.fun(FUN)
102 …args <- c(list(FUN = ...future.FUN), ...future.elements_ii, MoreArgs = list(MoreArgs), SIMPLIFY = … nameattr
111 …args <- c(list(FUN = ...future.FUN2), ...future.elements_ii, list(...future.seeds_ii_jj = ...futur… nameattr
121 FUN = FUN,
125 get_chunk = function(X, chunk) lapply(X, FUN = `[`, chunk),
177 future_.mapply <- function(FUN, dots, MoreArgs, ..., future.label = "future_.mapply-%d") { argument
179 list(FUN = FUN), nameattr
/dports/math/R/R-4.1.2/src/library/parallel/R/windows/
H A Dmcdummies.R19 mclapply <- function(X, FUN, ..., mc.preschedule = TRUE, mc.set.seed = TRUE, argument
26 lapply(X, FUN, ...)
29 pvec <- function(v, FUN, ..., mc.set.seed = TRUE, mc.silent = FALSE, argument
36 FUN(v, ...)
40 function(FUN, ..., MoreArgs = NULL, SIMPLIFY = TRUE, USE.NAMES = TRUE, argument
47 mapply(FUN = FUN, ..., MoreArgs = MoreArgs, SIMPLIFY = SIMPLIFY,
/dports/math/libRmath/R-4.1.1/src/library/parallel/R/windows/
H A Dmcdummies.R19 mclapply <- function(X, FUN, ..., mc.preschedule = TRUE, mc.set.seed = TRUE, argument
26 lapply(X, FUN, ...)
29 pvec <- function(v, FUN, ..., mc.set.seed = TRUE, mc.silent = FALSE, argument
36 FUN(v, ...)
40 function(FUN, ..., MoreArgs = NULL, SIMPLIFY = TRUE, USE.NAMES = TRUE, argument
47 mapply(FUN = FUN, ..., MoreArgs = MoreArgs, SIMPLIFY = SIMPLIFY,
/dports/lang/clisp/clisp-df3b9f6fdcff22832898e89a989eb499c0f842ed/src/
H A Dspvw_debug.d456 FUN(chart,cint,as_cint) in FUN() function
457 FUN(cint,chart,as_chart) in FUN()
458 FUN(object,chart,char_code) in FUN()
460 FUN(object,cint,char_int) in FUN()
461 FUN(cint,object,int_char) in FUN()
462 FUN(object,oint,as_oint) in FUN()
463 FUN(oint,object,as_object) in FUN()
471 FUN(object,Cons,TheCons) in FUN()
477 FUN(object,object,Car) in FUN()
478 FUN(object,object,Cdr) in FUN()
[all …]
/dports/devel/R-cran-future.apply/future.apply/tests/
H A Dfuture_sapply.R28 for (FUN in FUNS_x) { globalVar
29 y0 <- sapply(x, FUN = FUN,
31 y1 <- future_sapply(x, FUN = FUN,
36 y2 <- lapply(x, FUN = FUN)
49 future_sapply(x_vec, FUN = compute_with_dots)
H A Dfuture_mapply,globals.R64 call_my_add_caller <- function(a, b, FUN = call_my_add) { argument
65 do.call(FUN, args = list(a = a, b = b))
69 args = list(FUN = call_my_add)) {
165 FUN <- function(x) { function
169 y0 <- mapply(FUN = FUN, X)
171 sizes <- unclass(c(FUN = object.size(FUN), X = object.size(X))) nameattr
178 y <- future_mapply(FUN = FUN, X)
185 y <- future_mapply(FUN = FUN, X)
187 stopifnot(all(sapply(y, FUN = identical, oMaxSize)))
194 y <- future_mapply(FUN = FUN, X, future.chunk.size = chunk.size)
[all …]
/dports/devel/R-cran-Rcpp/Rcpp/inst/include/Rcpp/macros/
H A Dunroll.h68 #define RCPP_LOOP_UNROLL_LHSFUN(TARGET,FUN,SOURCE) \ argument
72 TARGET[FUN(i)] = SOURCE[i] ; i++ ; \
73 TARGET[FUN(i)] = SOURCE[i] ; i++ ; \
74 TARGET[FUN(i)] = SOURCE[i] ; i++ ; \
75 TARGET[FUN(i)] = SOURCE[i] ; i++ ; \
79 TARGET[FUN(i)] = SOURCE[i] ; i++ ; /* fallthrough */ \
81 TARGET[FUN(i)] = SOURCE[i] ; i++ ; /* fallthrough */ \
83 TARGET[FUN(i)] = SOURCE[i] ; i++ ; /* fallthrough */ \
/dports/math/R-cran-DoE.base/DoE.base/R/
H A Dformula.design.R1 formula.design <- function(x, ..., response = NULL, degree = NULL, FUN=NULL, use.center=NULL, use.s… argument
36 if (is.null(FUN)) FUN <- "mean"
37 x <- aggregate(x, FUN=FUN)
46 if (is.null(FUN)) FUN <- "mean"
47 x <- aggregate(x, FUN=FUN)
125 if (is.null(FUN)) FUN <- "mean"
126 x <- aggregate(reptowide(x),response=response, FUN=FUN)
135 message("analysing repeated measurement ", FUN)
138 if (is.null(FUN)) FUN <- "mean"
139 x <- aggregate(paramtowide(x),response=response, FUN=FUN)
[all …]
/dports/graphics/mupdf/mupdf-1.18.0-source/platform/java/jni/
H A Dpdfobject.c4 FUN(PDFObject_finalize)(JNIEnv *env, jobject self) in FUN() function
14 FUN(PDFObject_toIndirect)(JNIEnv *env, jobject self) in FUN() function
31 FUN(PDFObject_isIndirect)(JNIEnv *env, jobject self) in FUN() function
48 FUN(PDFObject_isNull)(JNIEnv *env, jobject self) in FUN() function
65 FUN(PDFObject_isBoolean)(JNIEnv *env, jobject self) in FUN() function
82 FUN(PDFObject_isInteger)(JNIEnv *env, jobject self) in FUN() function
99 FUN(PDFObject_isReal)(JNIEnv *env, jobject self) in FUN() function
116 FUN(PDFObject_isNumber)(JNIEnv *env, jobject self) in FUN() function
133 FUN(PDFObject_isString)(JNIEnv *env, jobject self) in FUN() function
150 FUN(PDFObject_isName)(JNIEnv *env, jobject self) in FUN() function
[all …]
/dports/math/R-cran-forecast/forecast/tests/testthat/
H A Dtest-modelAR.R34 …modelAR_model <- modelAR(lynx[1:100], FUN = avnnet2, predict.FUN = predict.avnnet2, p = 2, P = 1, …
42 …modelAR_model2 <- modelAR(lynx[101:114], FUN = avnnet2, predict.FUN = predict.avnnet2, model = mod…
58 …oilnnet_modelAR <- modelAR(airmiles, FUN = avnnet2, predict.FUN = predict.avnnet2, scale.inputs = …
63 …expect_silent(woolyrnqnnet <- modelAR(woolyrnq, FUN = avnnet2, predict.FUN = predict.avnnet2, scal…
115 FUN = avnnet2, predict.FUN = predict.avnnet2, scale.inputs = TRUE,
144 …airnnet <- modelAR(airmiles, , FUN = avnnet2, predict.FUN = predict.avnnet2, scale.inputs = TRUE, …
175 …expect_error(nnetfit <- modelAR(rnorm(2), FUN = avnnet2, predict.FUN = predict.avnnet2, p = 1, P =…
176 …expect_silent(nnetfit <- modelAR(rnorm(3), FUN = avnnet2, predict.FUN = predict.avnnet2, p = 1, P …
178 …expect_silent(nnetfit <- modelAR(rnorm(3), FUN = avnnet2, predict.FUN = predict.avnnet2, p = 2, P …
180 …expect_warning(nnetfit <- modelAR(rnorm(3), FUN = avnnet2, predict.FUN = predict.avnnet2, p = 3, P…
[all …]
/dports/math/R/R-4.1.2/src/library/parallel/R/
H A DclusterApply.R192 fun = lapply, FUN = fun, ...),
202 fun = lapply, FUN = fun, ...),
206 parRapply <- function(cl = NULL, x, FUN, ..., chunk.size = NULL) argument
212 fun = apply, MARGIN = 1L, FUN = FUN, ...),
221 fun = apply, MARGIN = 2L, FUN = FUN, ...),
230 FUN <- match.fun(FUN) # should this be done on worker?
231 answer <- parLapply(cl = cl, X = as.list(X), fun = FUN, ...,
244 FUN <- match.fun(FUN) # should this be done on worker?
258 FUN <- match.fun(FUN) # should this be done on worker?
296 ans <- FUN(if(length(d.call) < 2L) newX[,1] else
[all …]
/dports/math/libRmath/R-4.1.1/src/library/parallel/R/
H A DclusterApply.R192 fun = lapply, FUN = fun, ...),
202 fun = lapply, FUN = fun, ...),
206 parRapply <- function(cl = NULL, x, FUN, ..., chunk.size = NULL) argument
212 fun = apply, MARGIN = 1L, FUN = FUN, ...),
221 fun = apply, MARGIN = 2L, FUN = FUN, ...),
230 FUN <- match.fun(FUN) # should this be done on worker?
231 answer <- parLapply(cl = cl, X = as.list(X), fun = FUN, ...,
244 FUN <- match.fun(FUN) # should this be done on worker?
258 FUN <- match.fun(FUN) # should this be done on worker?
296 ans <- FUN(if(length(d.call) < 2L) newX[,1] else
[all …]
/dports/lang/ocaml-nox11/ocaml-4.05.0/testsuite/tests/asmcomp/
H A Dmain.c53 { extern long FUN(void); in main()
55 printf("%ld\n", call_gen_code(FUN)); in main()
63 { extern long FUN(long); in main()
65 printf("%ld\n", call_gen_code(FUN, atoi(argv[1]))); in main()
69 { extern double FUN(long); in main()
71 printf("%f\n", call_gen_code(FUN, atoi(argv[1]))); in main()
75 { extern void FUN(long, long, long *); in main()
90 call_gen_code(FUN, 0, n-1, a); in main()
/dports/lang/ocaml/ocaml-4.05.0/testsuite/tests/asmcomp/
H A Dmain.c53 { extern long FUN(void); in main()
55 printf("%ld\n", call_gen_code(FUN)); in main()
63 { extern long FUN(long); in main()
65 printf("%ld\n", call_gen_code(FUN, atoi(argv[1]))); in main()
69 { extern double FUN(long); in main()
71 printf("%f\n", call_gen_code(FUN, atoi(argv[1]))); in main()
75 { extern void FUN(long, long, long *); in main()
90 call_gen_code(FUN, 0, n-1, a); in main()
/dports/devel/R-cran-gtools/gtools/R/
H A DunByteCode.R59 FUN <- eval(parse(text = deparse(fun))) functionVar
60 environment(FUN) <- environment(fun)
61 FUN
77 FUN <- unByteCode(fun) functionVar
80 env = environment(FUN),
81 value = FUN
/dports/finance/R-cran-timeSeries/timeSeries/inst/extensionsTests/
H A DaggregateWrappers.R142 FUN <- mean globalVar
145 apply.daily(x, FUN)
146 apply.weekly(x, FUN)
147 apply.monthly(x, FUN)
148 apply.quarterly(x, FUN)
149 apply.yearly(x, FUN)
154 FUN <- mean globalVar
160 x1 <- timeSeries::aggregate(x.tS, by1, FUN)
163 x2 <- timeSeries::aggregate(x.tS, by2, FUN)
200 .period.apply(tS, INDEX, FUN=max)
[all …]
H A DxtsWrappers.R237 FUN <- mean globalVar
241 apply.daily(x, FUN)
242 apply.weekly(x, FUN)
243 apply.monthly(x, FUN)
244 apply.quarterly(x, FUN)
245 apply.yearly(x, FUN)
250 FUN <- mean globalVar
256 x1 <- timeSeries::aggregate(x.tS, by1, FUN)
259 x2 <- timeSeries::aggregate(x.tS, by2, FUN)
296 .period.apply(tS, INDEX, FUN=max)
[all …]
/dports/math/R-cran-sets/sets/man/
H A Douter.Rd9 set_outer(X, Y, FUN = "*", ..., SIMPLIFY = TRUE, quote = FALSE)
10 gset_outer(X, Y, FUN = "*", ..., SIMPLIFY = TRUE, quote = FALSE)
11 cset_outer(X, Y, FUN = "*", ..., SIMPLIFY = TRUE, quote = FALSE)
12 tuple_outer(X, Y, FUN = "*", ..., SIMPLIFY = TRUE, quote = FALSE)
16 will be used instead. In this case, \code{FUN} can also be specified
18 \item{FUN}{A function or function name (character string).}
20 \code{FUN} are atomic and of length 1, the result will be an atomic
26 \item{\dots}{Additional arguments passed to the \code{FUN}.}
29 This function applies \code{FUN} to all pairs of elements specified in
34 depending on the complexity of \code{FUN}'s return type and the
/dports/math/R-cran-matrixStats/matrixStats/R/
H A DrowAvgsPerColSet.R51 FUN = rowMeans, ..., na.rm = NA, tFUN = FALSE) { argument
84 if (!is.function(FUN)) {
107 Z <- apply(S, MARGIN = 2L, FUN = function(jj) {
120 Zjj <- FUN(Zjj, W = Wjj, ..., na.rm = na.rm)
123 Zjj <- FUN(Zjj, ..., na.rm = na.rm)
154 FUN = colMeans, ..., na.rm = NA, tFUN = FALSE) { argument
171 if (!is.function(FUN)) {
196 tZ <- rowAvgsPerColSet(X = tX, W = tW, S = S, FUN = FUN, ..., na.rm = na.rm, tFUN = !tFUN)
/dports/math/R/R-4.1.2/src/library/stats/R/
H A Daggregate.R33 function(x, by, FUN, ..., simplify = TRUE, drop = TRUE) argument
37 FUN <- match.fun(FUN)
102 ans <- lapply(X = unname(split(e, grp)), FUN = FUN, ...)
142 function(formula, data, FUN, ..., subset, na.action = na.omit) argument
152 m$... <- m$FUN <- NULL
199 aggregate.data.frame(lhs, mf[-1L], FUN = FUN, ...)
203 function(x, nfrequency = 1, FUN = sum, ndeltat = 1, argument
209 FUN <- match.fun(FUN)
241 MARGIN = c(2L, 3L), FUN = FUN, ...) nameattr
/dports/math/libRmath/R-4.1.1/src/library/stats/R/
H A Daggregate.R33 function(x, by, FUN, ..., simplify = TRUE, drop = TRUE) argument
37 FUN <- match.fun(FUN)
102 ans <- lapply(X = unname(split(e, grp)), FUN = FUN, ...)
142 function(formula, data, FUN, ..., subset, na.action = na.omit) argument
152 m$... <- m$FUN <- NULL
199 aggregate.data.frame(lhs, mf[-1L], FUN = FUN, ...)
203 function(x, nfrequency = 1, FUN = sum, ndeltat = 1, argument
209 FUN <- match.fun(FUN)
241 MARGIN = c(2L, 3L), FUN = FUN, ...) nameattr

12345678910>>...138