~rdoering/ubuntu/karmic/erlang/fix-535090

« back to all changes in this revision

Viewing changes to lib/stdlib/doc/src/erl_internal.xml

  • Committer: Bazaar Package Importer
  • Author(s): Sergei Golovan
  • Date: 2009-02-15 16:42:52 UTC
  • mfrom: (3.1.2 squeeze)
  • Revision ID: james.westby@ubuntu.com-20090215164252-q5x4rcf8a5pbesb1
Tags: 1:12.b.5-dfsg-2
Upload to unstable after lenny is released.

Show diffs side-by-side

added added

removed removed

Lines of Context:
 
1
<?xml version="1.0" encoding="latin1" ?>
 
2
<!DOCTYPE erlref SYSTEM "erlref.dtd">
 
3
 
 
4
<erlref>
 
5
  <header>
 
6
    <copyright>
 
7
      <year>1996</year>
 
8
      <year>2007</year>
 
9
      <holder>Ericsson AB, All Rights Reserved</holder>
 
10
    </copyright>
 
11
    <legalnotice>
 
12
  The contents of this file are subject to the Erlang Public License,
 
13
  Version 1.1, (the "License"); you may not use this file except in
 
14
  compliance with the License. You should have received a copy of the
 
15
  Erlang Public License along with this software. If not, it can be
 
16
  retrieved online at http://www.erlang.org/.
 
17
 
 
18
  Software distributed under the License is distributed on an "AS IS"
 
19
  basis, WITHOUT WARRANTY OF ANY KIND, either express or implied. See
 
20
  the License for the specific language governing rights and limitations
 
21
  under the License.
 
22
 
 
23
  The Initial Developer of the Original Code is Ericsson AB.
 
24
    </legalnotice>
 
25
 
 
26
    <title>erl_internal</title>
 
27
    <prepared>Robert Virding</prepared>
 
28
    <responsible>Bjarne D&auml;cker</responsible>
 
29
    <docno>1</docno>
 
30
    <approved>Bjarne D&auml;cker</approved>
 
31
    <checked></checked>
 
32
    <date>97-01-21</date>
 
33
    <rev>B</rev>
 
34
    <file>erl_internal.sgml</file>
 
35
  </header>
 
36
  <module>erl_internal</module>
 
37
  <modulesummary>Internal Erlang Definitions</modulesummary>
 
38
  <description>
 
39
    <p>This module defines Erlang BIFs, guard tests and operators.
 
40
      This module is only of interest to programmers who
 
41
      manipulate Erlang code.</p>
 
42
  </description>
 
43
  <funcs>
 
44
    <func>
 
45
      <name>bif(Name, Arity) -> bool()</name>
 
46
      <fsummary>Test for an Erlang BIF</fsummary>
 
47
      <type>
 
48
        <v>Name = atom()</v>
 
49
        <v>Arity = integer()</v>
 
50
      </type>
 
51
      <desc>
 
52
        <p>Returns <c>true</c> if <c>Name/Arity</c> is an Erlang BIF
 
53
          which is automatically recognized by the compiler, otherwise
 
54
          <c>false</c>.</p>
 
55
      </desc>
 
56
    </func>
 
57
    <func>
 
58
      <name>guard_bif(Name, Arity) -> bool()</name>
 
59
      <fsummary>Test for an Erlang BIF allowed in guards</fsummary>
 
60
      <type>
 
61
        <v>Name = atom()</v>
 
62
        <v>Arity = integer()</v>
 
63
      </type>
 
64
      <desc>
 
65
        <p>Returns <c>true</c> if <c>Name/Arity</c> is an Erlang BIF
 
66
          which is allowed in guards, otherwise <c>false</c>.</p>
 
67
      </desc>
 
68
    </func>
 
69
    <func>
 
70
      <name>type_test(Name, Arity) -> bool()</name>
 
71
      <fsummary>Test for a valid type test</fsummary>
 
72
      <type>
 
73
        <v>Name = atom()</v>
 
74
        <v>Arity = integer()</v>
 
75
      </type>
 
76
      <desc>
 
77
        <p>Returns <c>true</c> if <c>Name/Arity</c> is a valid Erlang
 
78
          type test, otherwise <c>false</c>.</p>
 
79
      </desc>
 
80
    </func>
 
81
    <func>
 
82
      <name>arith_op(OpName, Arity) -> bool()</name>
 
83
      <fsummary>Test for an arithmetic operator</fsummary>
 
84
      <type>
 
85
        <v>OpName = atom()</v>
 
86
        <v>Arity = integer()</v>
 
87
      </type>
 
88
      <desc>
 
89
        <p>Returns <c>true</c> if <c>OpName/Arity</c> is an arithmetic
 
90
          operator, otherwise <c>false</c>.</p>
 
91
      </desc>
 
92
    </func>
 
93
    <func>
 
94
      <name>bool_op(OpName, Arity) -> bool()</name>
 
95
      <fsummary>Test for a Boolean operator</fsummary>
 
96
      <type>
 
97
        <v>OpName = atom()</v>
 
98
        <v>Arity = integer()</v>
 
99
      </type>
 
100
      <desc>
 
101
        <p>Returns <c>true</c> if <c>OpName/Arity</c> is a Boolean
 
102
          operator, otherwise <c>false</c>.</p>
 
103
      </desc>
 
104
    </func>
 
105
    <func>
 
106
      <name>comp_op(OpName, Arity) -> bool()</name>
 
107
      <fsummary>Test for a comparison operator</fsummary>
 
108
      <type>
 
109
        <v>OpName = atom()</v>
 
110
        <v>Arity = integer()</v>
 
111
      </type>
 
112
      <desc>
 
113
        <p>Returns <c>true</c> if <c>OpName/Arity</c> is a comparison
 
114
          operator, otherwise <c>false</c>.</p>
 
115
      </desc>
 
116
    </func>
 
117
    <func>
 
118
      <name>list_op(OpName, Arity) -> bool()</name>
 
119
      <fsummary>Test for a list operator</fsummary>
 
120
      <type>
 
121
        <v>OpName = atom()</v>
 
122
        <v>Arity = integer()</v>
 
123
      </type>
 
124
      <desc>
 
125
        <p>Returns <c>true</c> if <c>OpName/Arity</c> is a list
 
126
          operator, otherwise <c>false</c>.</p>
 
127
      </desc>
 
128
    </func>
 
129
    <func>
 
130
      <name>send_op(OpName, Arity) -> bool()</name>
 
131
      <fsummary>Test for a send operator</fsummary>
 
132
      <type>
 
133
        <v>OpName = atom()</v>
 
134
        <v>Arity = integer()</v>
 
135
      </type>
 
136
      <desc>
 
137
        <p>Returns <c>true</c> if <c>OpName/Arity</c> is a send
 
138
          operator, otherwise <c>false</c>.</p>
 
139
      </desc>
 
140
    </func>
 
141
    <func>
 
142
      <name>op_type(OpName, Arity) -> Type</name>
 
143
      <fsummary>Return operator type</fsummary>
 
144
      <type>
 
145
        <v>OpName = atom()</v>
 
146
        <v>Arity = integer()</v>
 
147
        <v>Type = arith | bool | comp | list | send</v>
 
148
      </type>
 
149
      <desc>
 
150
        <p>Returns the <c>Type</c> of operator that <c>OpName/Arity</c> 
 
151
          belongs to, 
 
152
          or generates a <c>function_clause</c> error if it is not an 
 
153
          operator at all.</p>
 
154
      </desc>
 
155
    </func>
 
156
  </funcs>
 
157
</erlref>
 
158