| A | |
| access_permission [UnixLabels] | 
Flags for the  UnixLabels.accesscall. | 
| access_permission [Unix] | 
Flags for the  Unix.accesscall. | 
| addr_info [UnixLabels] | 
Address information returned by  Unix.getaddrinfo. | 
| addr_info [Unix] | 
Address information returned by  Unix.getaddrinfo. | 
| alarm [Gc] | 
An alarm is a piece of data that calls a user function at the end of
   each major GC cycle.
 | 
| anchor [Tk] | |
| anon_fun [Arg] | |
| B | |
| big_int [Big_int] | 
The type of big integers.
 | 
| borderMode [Tk] | |
| C | |
| c_layout [Bigarray] | |
| channel [Event] | 
The type of communication channels carrying values of type  'a. | 
| closure [CamlinternalOO] | |
| color [Graphics] | 
A color is specified by its R, G, B components.
 | 
| complex32_elt [Bigarray] | |
| complex64_elt [Bigarray] | |
| control [Gc] | 
The GC parameters are given as a  controlrecord. | 
| D | |
| data [Weak.S] | 
The type of the elements stored in the table.
 | 
| dir_handle [UnixLabels] | 
The type of descriptors over opened directories.
 | 
| dir_handle [Unix] | 
The type of descriptors over opened directories.
 | 
| doc [Arg] | |
| E | |
| elt [Set.S] | 
The type of the set elements.
 | 
| elt [MoreLabels.Set.S] | |
| error [UnixLabels] | 
The type of error codes.
 | 
| error [Unix] | 
The type of error codes.
 | 
| error [Dynlink] | |
| event [Tk] | |
| event [Graphics] | 
To specify events to wait for.
 | 
| event [Event] | 
The type of communication events returning a result of type  'a. | 
| eventField [Tk] | |
| eventInfo [Tk] | |
| extern_flags [Marshal] | 
The flags to the  Marshal.to_*functions below. | 
| F | |
| file_descr [UnixLabels] | 
The abstract type of file descriptors.
 | 
| file_descr [Unix] | 
The abstract type of file descriptors.
 | 
| file_kind [UnixLabels] | |
| file_kind [Unix] | |
| file_name [Scanf.Scanning] | 
A convenient alias to designate a file name.
 | 
| file_perm [UnixLabels] | 
The type of file access rights, e.g.
 | 
| file_perm [Unix] | 
The type of file access rights, e.g.
 | 
| fillMode [Tk] | |
| float32_elt [Bigarray] | |
| float64_elt [Bigarray] | |
| flow_action [UnixLabels] | |
| flow_action [Unix] | |
| flush_queue [UnixLabels] | |
| flush_queue [Unix] | |
| format [Pervasives] | |
| format4 [Pervasives] | 
Format strings have a general and highly polymorphic type
     ('a, 'b, 'c, 'd, 'e, 'f) format6. | 
| formatter [Format] | 
Abstract data corresponding to a pretty-printer (also called a
  formatter) and all its machinery.
 | 
| formatter_tag_functions [Format] | 
The tag handling functions specific to a formatter:
    markversions are the ``tag marking'' functions that associate a string
   marker to a tag in order for the pretty-printing engine to flush
   those markers as 0 length tokens in the output device of the formatter. | 
| fortran_layout [Bigarray] | 
To facilitate interoperability with existing C and Fortran code,
   this library supports two different memory layouts for big arrays,
   one compatible with the C conventions,
   the other compatible with the Fortran conventions.
 | 
| fpclass [Pervasives] | 
The five classes of floating-point numbers, as determined by
   the  classify_floatfunction. | 
| G | |
| getaddrinfo_option [UnixLabels] | 
Options to  Unix.getaddrinfo. | 
| getaddrinfo_option [Unix] | 
Options to  Unix.getaddrinfo. | 
| getnameinfo_option [UnixLabels] | 
Options to  Unix.getnameinfo. | 
| getnameinfo_option [Unix] | 
Options to  Unix.getnameinfo. | 
| group_entry [UnixLabels] | 
Structure of entries in the  groupsdatabase. | 
| group_entry [Unix] | 
Structure of entries in the  groupsdatabase. | 
| H | |
| host_entry [UnixLabels] | 
Structure of entries in the  hostsdatabase. | 
| host_entry [Unix] | 
Structure of entries in the  hostsdatabase. | 
| I | |
| image [Graphics] | 
The abstract type for images, in internal representation.
 | 
| impl [CamlinternalOO] | |
| in_channel [Scanf.Scanning] | 
The notion of input channel for the  Scanfmodule:
   those channels provide all the machinery necessary to read from a givenPervasives.in_channelvalue. | 
| in_channel [Pervasives] | 
The type of input channel.
 | 
| inet_addr [UnixLabels] | 
The abstract type of Internet addresses.
 | 
| inet_addr [Unix] | 
The abstract type of Internet addresses.
 | 
| init_table [CamlinternalOO] | |
| int16_signed_elt [Bigarray] | |
| int16_unsigned_elt [Bigarray] | |
| int32_elt [Bigarray] | |
| int64_elt [Bigarray] | |
| int8_signed_elt [Bigarray] | |
| int8_unsigned_elt [Bigarray] | |
| int_elt [Bigarray] | |
| interval_timer [UnixLabels] | 
The three kinds of interval timers.
 | 
| interval_timer [Unix] | 
The three kinds of interval timers.
 | 
| interval_timer_status [UnixLabels] | 
The type describing the status of an interval timer
 | 
| interval_timer_status [Unix] | 
The type describing the status of an interval timer
 | 
| K | |
| key [MoreLabels.Map.S] | |
| key [MoreLabels.Hashtbl.SeededS] | |
| key [MoreLabels.Hashtbl.S] | |
| key [Map.S] | 
The type of the map keys.
 | 
| key [Hashtbl.SeededS] | |
| key [Hashtbl.S] | |
| key [Arg] | |
| kind [Bigarray] | 
To each element kind is associated an OCaml type, which is
   the type of OCaml values that can be stored in the big array
   or read back from it.
 | 
| L | |
| label [CamlinternalOO] | |
| layout [Bigarray] | 
The type  'a layoutrepresents one of the two supported
   memory layouts: C-style if'aisBigarray.c_layout, Fortran-style
   if'aisBigarray.fortran_layout. | 
| lexbuf [Lexing] | 
The type of lexer buffers.
 | 
| linking_error [Dynlink] | |
| lock_command [UnixLabels] | 
Commands for  UnixLabels.lockf. | 
| lock_command [Unix] | 
Commands for  Unix.lockf. | 
| M | |
| meth [CamlinternalOO] | |
| modifier [Tk] | |
| msg_flag [UnixLabels] | |
| msg_flag [Unix] | |
| N | |
| name_info [UnixLabels] | 
Name of service or port number
 | 
| name_info [Unix] | 
Name of service or port number
 | 
| nativeint_elt [Bigarray] | |
| num [Num] | 
The type of numbers.
 | 
| O | |
| obj [CamlinternalOO] | |
| open_flag [UnixLabels] | 
The flags to  UnixLabels.openfile. | 
| open_flag [Unix] | 
The flags to  Unix.openfile. | 
| open_flag [Pervasives] | 
Opening modes for  open_out_genandopen_in_gen. | 
| out_channel [Pervasives] | 
The type of output channel.
 | 
| P | |
| params [CamlinternalOO] | |
| passwd_entry [UnixLabels] | 
Structure of entries in the  passwddatabase. | 
| passwd_entry [Unix] | 
Structure of entries in the  passwddatabase. | 
| position [Lexing] | 
A value of type  positiondescribes a point in a source file. | 
| process_status [UnixLabels] | 
The termination status of a process.
 | 
| process_status [Unix] | 
The termination status of a process.
 | 
| process_times [UnixLabels] | 
The execution times (CPU times) of a process.
 | 
| process_times [Unix] | 
The execution times (CPU times) of a process.
 | 
| protocol_entry [UnixLabels] | 
Structure of entries in the  protocolsdatabase. | 
| protocol_entry [Unix] | 
Structure of entries in the  protocolsdatabase. | 
| R | |
| ratio [Ratio] | |
| ref [Pervasives] | 
The type of references (mutable indirection cells) containing
   a value of type  'a. | 
| regexp [Str] | 
The type of compiled regular expressions.
 | 
| S | |
| scanbuf [Scanf.Scanning] | 
The type of scanning buffers.
 | 
| scanner [Scanf] | 
The type of formatted input scanners:  ('a, 'b, 'c, 'd) scanneris the type of a formatted input function that reads from some
    formatted input channel according to some format string; more
    precisely, ifscanis some formatted input function, thenscan
    ic fmt fappliesfto the arguments specified by the format
    stringfmt, whenscanhas read those arguments from the
    formatted input channelic. | 
| seek_command [UnixLabels] | 
Positioning modes for  UnixLabels.lseek. | 
| seek_command [Unix] | 
Positioning modes for  Unix.lseek. | 
| service_entry [UnixLabels] | 
Structure of entries in the  servicesdatabase. | 
| service_entry [Unix] | 
Structure of entries in the  servicesdatabase. | 
| setattr_when [UnixLabels] | |
| setattr_when [Unix] | |
| shape [CamlinternalMod] | |
| shutdown_command [UnixLabels] | 
The type of commands for  shutdown. | 
| shutdown_command [Unix] | 
The type of commands for  shutdown. | 
| side [Tk] | |
| signal_behavior [Sys] | |
| sigprocmask_command [UnixLabels] | |
| sigprocmask_command [Unix] | |
| sockaddr [UnixLabels] | |
| sockaddr [Unix] | |
| socket_bool_option [UnixLabels] | 
The socket options that can be consulted with  UnixLabels.getsockoptand modified withUnixLabels.setsockopt. | 
| socket_bool_option [Unix] | 
The socket options that can be consulted with  Unix.getsockoptand modified withUnix.setsockopt. | 
| socket_domain [UnixLabels] | 
The type of socket domains.
 | 
| socket_domain [Unix] | 
The type of socket domains.
 | 
| socket_float_option [UnixLabels] | 
The socket options that can be consulted with  UnixLabels.getsockopt_floatand modified withUnixLabels.setsockopt_float. | 
| socket_float_option [Unix] | 
The socket options that can be consulted with  Unix.getsockopt_floatand modified withUnix.setsockopt_float. | 
| socket_int_option [UnixLabels] | 
The socket options that can be consulted with  UnixLabels.getsockopt_intand modified withUnixLabels.setsockopt_int. | 
| socket_int_option [Unix] | 
The socket options that can be consulted with  Unix.getsockopt_intand modified withUnix.setsockopt_int. | 
| socket_optint_option [UnixLabels] | 
The socket options that can be consulted with  Unix.getsockopt_optintand modified withUnix.setsockopt_optint. | 
| socket_optint_option [Unix] | 
The socket options that can be consulted with  Unix.getsockopt_optintand modified withUnix.setsockopt_optint. | 
| socket_type [UnixLabels] | 
The type of socket kinds, specifying the semantics of
   communications.
 | 
| socket_type [Unix] | 
The type of socket kinds, specifying the semantics of
   communications.
 | 
| spec [Arg] | 
The concrete type describing the behavior associated
   with a keyword.
 | 
| split_result [Str] | |
| stat [Gc] | 
The memory management counters are returned in a  statrecord. | 
| statistics [MoreLabels.Hashtbl] | |
| statistics [Hashtbl] | |
| stats [UnixLabels.LargeFile] | |
| stats [UnixLabels] | 
The information returned by the  UnixLabels.statcalls. | 
| stats [Unix.LargeFile] | |
| stats [Unix] | 
The information returned by the  Unix.statcalls. | 
| stats [CamlinternalOO] | |
| status [Graphics] | 
To report events.
 | 
| T | |
| t [Weak.S] | 
The type of tables that contain elements of type  data. | 
| t [Weak] | 
The type of arrays of weak pointers (weak arrays).
 | 
| t [Thread] | 
The type of thread handles.
 | 
| t [StringLabels] | 
An alias for the type of strings.
 | 
| t [String] | 
An alias for the type of strings.
 | 
| t [Stream] | 
The type of streams holding values of type  'a. | 
| t [StdLabels.String] | |
| t [Stack] | 
The type of stacks containing elements of type  'a. | 
| t [Set.S] | 
The type of sets.
 | 
| t [Random.State] | 
The type of PRNG states.
 | 
| t [Queue] | 
The type of queues containing elements of type  'a. | 
| t [Obj] | |
| t [Nativeint] | 
An alias for the type of native integers.
 | 
| t [Mutex] | 
The type of mutexes.
 | 
| t [Set.OrderedType] | 
The type of the set elements.
 | 
| t [MoreLabels.Set.S] | |
| t [MoreLabels.Map.S] | |
| t [MoreLabels.Hashtbl.SeededS] | |
| t [MoreLabels.Hashtbl.S] | |
| t [MoreLabels.Hashtbl] | |
| t [Map.OrderedType] | 
The type of the map keys.
 | 
| t [Map.S] | 
The type of maps from type  keyto type'a. | 
| t [Lazy] | 
A value of type  'a Lazy.tis a deferred computation, called
   a suspension, that has a result of type'a. | 
| t [Int64] | 
An alias for the type of 64-bit integers.
 | 
| t [Int32] | 
An alias for the type of 32-bit integers.
 | 
| t [Hashtbl.SeededHashedType] | 
The type of the hashtable keys.
 | 
| t [Hashtbl.HashedType] | 
The type of the hashtable keys.
 | 
| t [Hashtbl.SeededS] | |
| t [Hashtbl.S] | |
| t [Hashtbl] | 
The type of hash tables from type  'ato type'b. | 
| t [Digest] | 
The type of digests: 16-character strings.
 | 
| t [Condition] | 
The type of condition variables.
 | 
| t [Complex] | 
The type of complex numbers.
 | 
| t [Char] | 
An alias for the type of characters.
 | 
| t [CamlinternalOO] | |
| t [Buffer] | 
The abstract type of buffers.
 | 
| t [Bigarray.Array3] | 
The type of three-dimensional big arrays whose elements have
     OCaml type  'a, representation kind'b, and memory layout'c. | 
| t [Bigarray.Array2] | 
The type of two-dimensional big arrays whose elements have
     OCaml type  'a, representation kind'b, and memory layout'c. | 
| t [Bigarray.Array1] | 
The type of one-dimensional big arrays whose elements have
     OCaml type  'a, representation kind'b, and memory layout'c. | 
| t [Bigarray.Genarray] | 
The type  Genarray.tis the type of big arrays with variable
     numbers of dimensions. | 
| table [CamlinternalOO] | |
| tables [CamlinternalOO] | |
| tag [Format] | |
| tag [CamlinternalOO] | |
| terminal_io [UnixLabels] | |
| terminal_io [Unix] | |
| tm [UnixLabels] | 
The type representing wallclock time and calendar date.
 | 
| tm [Unix] | 
The type representing wallclock time and calendar date.
 | 
| token [Genlex] | 
The type of tokens.
 | 
| U | |
| units [Tk] | |
| usage_msg [Arg] | |
| W | |
| wait_flag [UnixLabels] | 
Flags for  UnixLabels.waitpid. | 
| wait_flag [Unix] | 
Flags for  Unix.waitpid. | 
| window_id [GraphicsX11] |