File: unknown_erlang_apply_func.txt

package info (click to toggle)
erlang 1%3A27.3.4.1%2Bdfsg-1
  • links: PTS, VCS
  • area: main
  • in suites: trixie
  • size: 225,000 kB
  • sloc: erlang: 1,658,966; ansic: 405,769; cpp: 177,850; xml: 82,435; makefile: 15,031; sh: 14,401; lisp: 9,812; java: 8,603; asm: 6,541; perl: 5,836; python: 5,484; sed: 72
file content (36 lines) | stat: -rw-r--r-- 1,389 bytes parent folder | download | duplicates (2)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36

  apply(Fun, Args)

  Calls a fun, passing the elements in Args as arguments.

  If the number of elements in the arguments are known at compile
  time, the call is better written as Fun(Arg1, Arg2, ... ArgN).

  Warning

    Earlier, Fun could also be specified as {Module, Function},
    equivalent to apply(Module, Function, Args). This use is
    deprecated and will stop working in a future release.

  apply(Module, Function, Args)

  Returns the result of applying Function in Module to Args.
  The applied function must be exported from Module. The arity of
  the function is the length of Args.

  For example:

    > apply(lists, reverse, [[a, b, c]]).
    [c,b,a]
    > apply(erlang, atom_to_list, ['Erlang']).
    "Erlang"

  If the number of arguments are known at compile time, the call is
  better written as Module:Function(Arg1, Arg2, ..., ArgN).

  Failure: error_handler:undefined_function/3 is called if the
  applied function is not exported. The error handler can be
  redefined (see process_flag/2). If error_handler is undefined,
  or if the user has redefined the default error_handler so the
  replacement module is undefined, an error with reason undef is
  generated.