Index of values

( * ) [Stdlib]

Integer multiplication.

( ** ) [Stdlib]

Exponentiation

( *. ) [Stdlib]

Floating-point multiplication

(!) [Stdlib]

!r returns the current contents of reference r.

(!=) [Stdlib]

Negation of Stdlib.(==).

(&&) [Stdlib]

The boolean ``and''.

(&) [Stdlib]
(+) [Stdlib]

Integer addition.

(+.) [Stdlib]

Floating-point addition

(-) [Stdlib]

Integer subtraction.

(-.) [Stdlib]

Floating-point subtraction

(/) [Stdlib]

Integer division.

(/.) [Stdlib]

Floating-point division.

(:=) [Stdlib]

r := a stores the value of a in reference r.

(<) [Stdlib]
(<=) [Stdlib]
(<>) [Stdlib]

Negation of Stdlib.(=).

(=) [Stdlib]

e1 = e2 tests for structural equality of e1 and e2.

(==) [Stdlib]

e1 == e2 tests for physical equality of e1 and e2.

(>) [Stdlib]
(>=) [Stdlib]

Structural ordering functions.

(@) [Stdlib]

List concatenation.

(^) [Stdlib]

String concatenation.

(^^) [Stdlib]

f1 ^^ f2 catenates formats f1 and f2.

(asr) [Stdlib]

n asr m shifts n to the right by m bits.

(land) [Stdlib]

Bitwise logical and.

(lor) [Stdlib]

Bitwise logical or.

(lsl) [Stdlib]

n lsl m shifts n to the left by m bits.

(lsr) [Stdlib]

n lsr m shifts n to the right by m bits.

(lxor) [Stdlib]

Bitwise logical exclusive or.

(mod) [Stdlib]

Integer remainder.

(or) [Stdlib]

The boolean ``or''.

(~-) [Stdlib]

Unary negation.

(~-.) [Stdlib]

Unary negation.

A
abs [Stdlib]

Return the absolute value of the argument.

abs [Nativeint]

Return the absolute value of its argument.

abs [Int64]

Return the absolute value of its argument.

abs [Int32]

Return the absolute value of its argument.

abs_float [Stdlib]

Return the absolute value of the argument.

abstract_tag [Obj]
accept [Unix]

Accept connections on the given socket.

access [Unix]

Check that the process has the given permissions over the named file.

acos [Stdlib]
add [Queue]

add x q adds the element x at the end of the queue q.

add [Nativeint]

Addition.

add [Int64]

Addition.

add [Int32]

Addition.

add [Hashtbl]

Hashtbl.add tbl x y adds a binding of x to y in table tbl.

add [Complex]

Addition

add_buffer [Buffer]

add_buffer b1 b2 appends the current contents of buffer b2 at the end of buffer b1.

add_channel [Buffer]

add_channel b ic n reads exactly n character from the input channel ic and stores them at the end of buffer b.

add_char [Buffer]

add_char b c appends the character c at the end of the buffer b.

add_string [Buffer]

add_string b s appends the string s at the end of the buffer b.

add_substitute [Buffer]

add_substitute b f s appends the string pattern s at the end of the buffer b with substitution.

add_substring [Buffer]

add_substring b s ofs len takes len characters from offset ofs in string s and appends them at the end of the buffer b.

alarm [Unix]

Schedule a SIGALRM signal after the given number of seconds.

align [Arg]

Align the documentation strings by inserting spaces at the first space, according to the length of the keyword.

allocated_bytes [Gc]

Return the total number of bytes allocated since the program was started.

append [List]

Catenate two lists.

append [Array]

Array.append v1 v2 returns a fresh array containing the concatenation of the arrays v1 and v2.

arg [Complex]

Argument.

argv [Sys]

The command line arguments given to the process.

array [Sort]

Sort an array in increasing order according to an ordering predicate.

asin [Stdlib]
assoc [List]

assoc a l returns the value associated with key a in the list of pairs l.

assq [List]

Same as List.assoc, but uses physical equality instead of structural equality to compare keys.

at_exit [Stdlib]

Register the given function to be called at program termination time.

atan [Stdlib]
atan2 [Stdlib]

The usual trigonometric functions.

auto_synchronize [Graphics]

By default, drawing takes place both on the window displayed on screen, and in a memory area (the ``backing store'').

B
background [Graphics]
basename [Filename]

Split a file name into directory name / base file name.

bind [Unix]

Bind a socket to an address.

bits [Random]

Return 30 random bits in a nonnegative integer.

bits_of_float [Int64]

Return the internal representation of the given float according to the IEEE 754 floating-point ``double format'' bit layout.

bits_of_float [Int32]

Return the internal representation of the given float according to the IEEE 754 floating-point ``single format'' bit layout.

black [Graphics]
blit [Weak]

Weak.blit ar1 off1 ar2 off2 len copies len weak pointers from ar1 (starting at off1) to ar2 (starting at off2).

blit [String]

String.blit src srcoff dst dstoff len copies len characters from string src, starting at character number srcoff, to string dst, starting at character number dstoff.

blit [Bytes]

blit src srcoff dst dstoff len copies len bytes from sequence src, starting at index srcoff, to sequence dst, starting at index dstoff.

blit [Array]

Array.blit v1 o1 v2 o2 len copies len elements from array v1, starting at element number o1, to array v2, starting at element number o2.

blit_image [Graphics]

blit_image img x y copies screen pixels into the image img, modifying img in-place.

blit_string [Bytes]

blit src srcoff dst dstoff len copies len bytes from string src, starting at index srcoff, to byte sequence dst, starting at index dstoff.

blue [Graphics]
bool [Random]

Random.bool () returns true or false with probability 0.5 each.

bool_of_string [Stdlib]

Convert the given string to a boolean.

bounded_full_split [Str]

Same as Str.bounded_split_delim, but returns the delimiters as well as the substrings contained between delimiters.

bounded_split [Str]

Same as Str.split, but splits into at most n substrings, where n is the extra integer parameter.

bounded_split_delim [Str]

Same as Str.bounded_split, but occurrences of the delimiter at the beginning and at the end of the string are recognized and returned as empty strings in the result.

bprintf [Printf]

Same as Printf.fprintf, but instead of printing on an output channel, append the formatted arguments to the given extensible buffer (see module Buffer).

bprintf [Format]

Same as sprintf above, but instead of printing on a string, writes into the given extensible buffer.

button_down [Graphics]

Return true if the mouse button is pressed, false otherwise.

C
capitalize [String]

Return a copy of the argument, with the first letter set to uppercase.

capitalize [Bytes]
capitalize_ascii [Bytes]

Return a copy of the argument, with the first character set to uppercase, using the US-ASCII character set.

cat [Bytes]

cat s1 s2 concatenates s1 and s2 and returns the result as new byte sequence.

catch [Printexc]

Printexc.catch fn x is similar to Printexc.print, but aborts the program with exit code 2 after printing the uncaught exception.

catch_break [Sys]

catch_break governs whether interactive interrupt (ctrl-C) terminates the program or raises the Break exception.

ceil [Stdlib]
changeable [Rml_process_manager]

run changeable change p state associates an id to the process (p state) and executes it.

channel [Digest]

If len is nonnegative, Digest.channel ic len reads len characters from channel ic and returns their digest, or raises End_of_file if end-of-file is reached before len characters are read.

char_of_int [Stdlib]

Return the character with the given ASCII code.

chdir [Unix]

Change the process working directory.

chdir [Sys]

Change the current working directory of the process.

check [Weak]

Weak.check ar n returns true if the nth cell of ar is full, false if it is empty.

check_suffix [Filename]

check_suffix name suff returns true if the filename name ends with the suffix suff.

chmod [Unix]

Change the permissions of the named file.

chop_extension [Filename]

Return the given file name without its extension.

chop_suffix [Filename]

chop_suffix name suff removes the suffix suff from the filename name.

chown [Unix]

Change the owner uid and owner gid of the named file.

chr [Char]

Return the character with the given ASCII code.

chroot [Unix]

Change the process root directory.

classify_float [Stdlib]

Return the class of the given floating-point number: normal, subnormal, zero, infinite, or not a number.

clear [Stack]

Discard all elements from a stack.

clear [Queue]

Discard all elements from a queue.

clear [Hashtbl]

Empty a hash table.

clear [Buffer]

Empty the buffer.

clear_close_on_exec [Unix]

Clear the ``close-on-exec'' flag on the given descriptor.

clear_graph [Graphics]

Erase the graphics window.

clear_nonblock [Unix]

Clear the ``non-blocking'' flag on the given descriptor.

clear_parser [Parsing]

Empty the parser stack.

close [Unix]

Close a file descriptor.

close_box [Format]

Closes the most recently opened pretty-printing box.

close_graph [Graphics]

Delete the graphics window or switch the screen back to text mode.

close_in [Stdlib]

Close the given channel.

close_in_noerr [Stdlib]

Same as close_in, but ignore all errors.

close_out [Stdlib]

Close the given channel, flushing all buffered write operations.

close_out_noerr [Stdlib]

Same as close_out, but ignore all errors.

close_process [Unix]

Close channels opened by Unix.open_process, wait for the associated command to terminate, and return its termination status.

close_process_full [Unix]

Close channels opened by Unix.open_process_full, wait for the associated command to terminate, and return its termination status.

close_process_in [Unix]

Close channels opened by Unix.open_process_in, wait for the associated command to terminate, and return its termination status.

close_process_out [Unix]

Close channels opened by Unix.open_process_out, wait for the associated command to terminate, and return its termination status.

close_tag [Format]

close_tag () closes the most recently opened tag t.

close_tbox [Format]

Closes the most recently opened tabulation box.

closedir [Unix]

Close a directory descriptor.

closure_tag [Obj]
code [Char]

Return the ASCII code of the argument.

combine [List]

Transform a pair of lists into a list of pairs: combine [a1; ...; an] [b1; ...; bn] is [(a1,b1); ...; (an,bn)].

command [Sys]

Execute the given shell command and return its exit code.

compact [Gc]

Perform a full major collection and compact the heap.

compare [String]

The comparison function for strings, with the same specification as Stdlib.compare.

compare [Stdlib]

compare x y returns 0 if x=y, a negative integer if x<y, and a positive integer if x>y.

compare [Nativeint]

The comparison function for native integers, with the same specification as Stdlib.compare.

compare [Int64]

The comparison function for 64-bit integers, with the same specification as Stdlib.compare.

compare [Int32]

The comparison function for 32-bit integers, with the same specification as Stdlib.compare.

compare [Char]

The comparison function for characters, with the same specification as Stdlib.compare.

compare [Bytes]

The comparison function for byte sequences, with the same specification as Stdlib.compare.

concat [String]

String.concat sep sl concatenates the list of strings sl, inserting the separator string sep between each.

concat [List]

Concatenate a list of lists.

concat [Filename]

concat dir file returns a file name that designates file file in directory dir.

concat [Bytes]

concat sep sl concatenates the list of byte sequences sl, inserting the separator byte sequence sep between each, and returns the result as a new byte sequence.

concat [Array]

Same as Array.append, but concatenates a list of arrays.

conj [Complex]

Conjugate: given the complex x + i.y, returns x - i.y.

connect [Unix]

Connect a socket to an address.

contains [String]

String.contains s c tests if character c appears in the string s.

contains [Bytes]

contains s c tests if byte c appears in s.

contains_from [String]

String.contains_from s start c tests if character c appears in the substring of s starting from start to the end of s.

contains_from [Bytes]

contains_from s start c tests if byte c appears in s after position start.

contents [Buffer]

Return a copy of the current contents of the buffer.

copy [String]

Return a copy of the given string.

copy [Stack]

Return a copy of the given stack.

copy [Queue]

Return a copy of the given queue.

copy [Hashtbl]

Return a copy of the given hashtable.

copy [Bytes]

Return a new byte sequence that contains the same bytes as the argument.

copy [Array]

Array.copy a returns a copy of a, that is, a fresh array containing the same elements as a.

cos [Stdlib]
cosh [Stdlib]
count [Stream]

Return the current count of the stream elements, i.e.

counters [Gc]

Return (minor_words, promoted_words, major_words).

create [Weak]

Weak.create n returns a new weak array of length n.

create [String]

String.create n returns a fresh string of length n.

create [Stack]

Return a new stack, initially empty.

create [Queue]

Return a new queue, initially empty.

create [Hashtbl]

Hashtbl.create n creates a new, empty hash table, with initial size n.

create [Bytes]

create n returns a new byte sequence of length n.

create [Buffer]

create n returns a fresh buffer, initially empty.

create [Array]
create_alarm [Gc]

create_alarm f will arrange for f to be called at the end of each major GC cycle, starting with the current cycle or the next one.

create_image [Graphics]

create_image w h returns a new image w pixels wide and h pixels tall, to be used in conjunction with blit_image.

create_matrix [Array]
create_process [Unix]

create_process prog args new_stdin new_stdout new_stderr forks a new process that executes the program in file prog, with arguments args.

create_process_env [Unix]

create_process_env prog args env new_stdin new_stdout new_stderr works as Unix.create_process, except that the extra argument env specifies the environment passed to the program.

current [Arg]

Position (in Sys.argv) of the argument being processed.

current_dir_name [Filename]

The conventional name for the current directory (e.g.

current_point [Graphics]

Return the position of the current point.

current_x [Graphics]

Return the abscissa of the current point.

current_y [Graphics]

Return the ordinate of the current point.

curveto [Graphics]

curveto b c d draws a cubic Bezier curve starting from the current point to point d, with control points b and c, and moves the current point to d.

custom_tag [Obj]
cyan [Graphics]
D
data_size [Marshal]
decr [Stdlib]

Decrement the integer contained in the given reference.

delete_alarm [Gc]

delete_alarm a will stop the calls to the function associated to a.

descr_of_in_channel [Unix]

Return the descriptor corresponding to an input channel.

descr_of_out_channel [Unix]

Return the descriptor corresponding to an output channel.

dirname [Filename]
display_mode [Graphics]

Set display mode on or off.

div [Nativeint]

Integer division.

div [Int64]

Integer division.

div [Int32]

Integer division.

div [Complex]

Division

domain_of_sockaddr [Unix]

Return the socket domain adequate for the given socket address.

double_array_tag [Obj]
double_tag [Obj]
draw_arc [Graphics]

draw_arc x y rx ry a1 a2 draws an elliptical arc with center x,y, horizontal radius rx, vertical radius ry, from angle a1 to angle a2 (in degrees).

draw_char [Graphics]
draw_circle [Graphics]

draw_circle x y r draws a circle with center x,y and radius r.

draw_ellipse [Graphics]

draw_ellipse x y rx ry draws an ellipse with center x,y, horizontal radius rx and vertical radius ry.

draw_image [Graphics]

Draw the given image with lower left corner at the given point.

draw_poly [Graphics]

draw_poly polygon draws the given polygon.

draw_poly_line [Graphics]

draw_poly_line points draws the line that joins the points given by the array argument.

draw_rect [Graphics]

draw_rect x y w h draws the rectangle with lower left corner at x,y, width w and height h.

draw_segments [Graphics]

draw_segments segments draws the segments given in the array argument.

draw_string [Graphics]

Draw a character or a character string with lower left corner at current position.

dummy_pos [Lexing]

A value of type position, guaranteed to be different from any valid position.

dump_image [Graphics]

Convert an image to a color matrix.

dup [Unix]

Return a new file descriptor referencing the same file as the given descriptor.

dup [Obj]
dup2 [Unix]

dup2 fd1 fd2 duplicates fd1 to fd2, closing fd2 if already opened.

E
empty [Stream]

Return () if the stream is empty, else raise Stream.Failure.

empty [Bytes]

A byte sequence of size 0.

environment [Unix]

Return the process environment, as an array of strings with the format ``variable=value''.

eprintf [Printf]

Same as Printf.fprintf, but output on stderr.

eprintf [Format]

Same as fprintf above, but output on err_formatter.

epsilon_float [Stdlib]

The smallest positive float x such that 1.0 +. x <> 1.0.

equal [Bytes]

The equality function for byte sequences.

err_formatter [Format]

A formatter to use with formatting functions below for output to standard error.

error_message [Unix]

Return a string describing the given error code.

escaped [String]

Return a copy of the argument, with special characters represented by escape sequences, following the lexical conventions of Objective Caml.

escaped [Char]

Return a string representing the given character, with special characters escaped following the lexical conventions of Objective Caml.

escaped [Bytes]

Return a copy of the argument, with special characters represented by escape sequences, following the lexical conventions of OCaml.

establish_server [Unix]

Establish a server on the given address.

exec [Rml_async]

exec term f x spawns the computation of f x in a thread and terminates instantaneously.

executable_name [Sys]

The name of the file containing the executable currently running.

execv [Unix]

execv prog args execute the program in file prog, with the arguments args, and the current process environment.

execve [Unix]

Same as Unix.execv, except that the third argument provides the environment to the program executed.

execvp [Unix]

Same as Unix.execv, except that the program is searched in the path.

execvpe [Unix]

Same as Unix.execve, except that the program is searched in the path.

exists [List]

exists p [a1; ...; an] checks if at least one element of the list satisfies the predicate p.

exists2 [List]

Same as List.exists, but for a two-argument predicate.

exit [Stdlib]

Terminate the process, returning the given status code to the operating system: usually 0 to indicate no errors, and a small positive integer to indicate failure.

exp [Stdlib]

Exponential.

exp [Complex]

Exponentiation.

extend [Bytes]

extend s left right returns a new byte sequence that contains the bytes of s, with left uninitialized bytes prepended and right uninitialized bytes appended to it.

extensible [Rml_process_manager]

run extensible add p state associates an id to the process (p state) and executes it.

F
failwith [Stdlib]

Raise exception Failure with the given string.

fast_sort [List]

Same as List.sort or List.stable_sort, whichever is faster on typical input.

fast_sort [Array]

Same as Array.sort or Array.stable_sort, whichever is faster on typical input.

fchmod [Unix]

Change the permissions of an opened file.

fchown [Unix]

Change the owner uid and owner gid of an opened file.

field [Obj]
file [Digest]

Return the digest of the file whose name is given.

file_exists [Sys]

Test if a file with the given name exists.

fill [Weak]

Weak.fill ar ofs len el sets to el all pointers of ar from ofs to ofs + len - 1.

fill [String]

String.fill s start len c modifies string s in place, replacing the characters number start to start + len - 1 by c.

fill [Bytes]

fill s start len c modifies s in place, replacing len characters with c, starting at start.

fill [Array]

Array.fill a ofs len x modifies the array a in place, storing x in elements number ofs to ofs + len - 1.

fill_arc [Graphics]

Fill an elliptical pie slice with the current color.

fill_circle [Graphics]

Fill a circle with the current color.

fill_ellipse [Graphics]

Fill an ellipse with the current color.

fill_poly [Graphics]

Fill the given polygon with the current color.

fill_rect [Graphics]

fill_rect x y w h fills the rectangle with lower left corner at x,y, width w and height h, with the current color.

filter [List]

filter p l returns all the elements of the list l that satisfy the predicate p.

final_tag [Obj]
finalise [Gc]

finalise f v registers f as a finalisation function for v.

finalise_release [Gc]

A finalisation function may call finalise_release to tell the GC that it can launch the next finalisation function without waiting for the current one to return.

find [List]

find p l returns the first element of the list l that satisfies the predicate p.

find [Hashtbl]

Hashtbl.find tbl x returns the current binding of x in tbl, or raises Not_found if no such binding exists.

find_all [List]

find_all is another name for List.filter.

find_all [Hashtbl]

Hashtbl.find_all tbl x returns the list of all data associated with x in tbl.

first_chars [Str]

first_chars s n returns the first n characters of s.

flatten [List]

Same as concat.

float [Stdlib]
float [Random]

Random.float bound returns a random floating-point number between 0 (inclusive) and bound (exclusive).

float_of_bits [Int64]

Return the floating-point number whose internal representation, according to the IEEE 754 floating-point ``double format'' bit layout, is the given int64.

float_of_bits [Int32]

Return the floating-point number whose internal representation, according to the IEEE 754 floating-point ``single format'' bit layout, is the given int32.

float_of_int [Stdlib]

Convert an integer to floating-point.

float_of_string [Stdlib]

Convert the given string to a float.

floor [Stdlib]

Round the given float to an integer value.

flush [Stdlib]

Flush the buffer associated with the given output channel, performing all pending writes on that channel.

flush_all [Stdlib]

Flush all open output channels; ignore errors.

flush_input [Lexing]

Discard the contents of the buffer and reset the current position to 0.

flush_str_formatter [Format]

Returns the material printed with str_formatter, flushes the formatter and resets the corresponding buffer.

fold [Queue]

fold f accu q is equivalent to List.fold_left f accu l, where l is the list of q's elements.

fold [Hashtbl]

Hashtbl.fold f tbl init computes (f kN dN ... (f k1 d1 init)...), where k1 ... kN are the keys of all bindings in tbl, and d1 ... dN are the associated values.

fold_left [Rml_list]

run Rml_list.fold_left p a [b1; ...; bn] is run p (... (run p (run p a b1) b2) ...) bn.

fold_left [List]

List.fold_left f a [b1; ...; bn] is f (... (f (f a b1) b2) ...) bn.

fold_left [Array]

Array.fold_left f x a computes f (... (f (f x a.(0)) a.(1)) ...) a.(n-1), where n is the length of the array a.

fold_left2 [Rml_list]

run Rml_list.fold_left2 p a [b1; ...; bn] [c1; ...; cn] is run p (... (run p (run p a b1 c1) b2 c2) ...) bn cn.

fold_left2 [List]

List.fold_left2 f a [b1; ...; bn] [c1; ...; cn] is f (... (f (f a b1 c1) b2 c2) ...) bn cn.

fold_right [Rml_list]

run Rml_list.fold_right p [a1; ...; an] b is run p a1 (run p a2 (... (run p an b) ...)).

fold_right [List]

List.fold_right f [a1; ...; an] b is f a1 (f a2 (... (f an b) ...)).

fold_right [Array]

Array.fold_right f a x computes f a.(0) (f a.(1) ( ... (f a.(n-1) x) ...)), where n is the length of the array a.

fold_right2 [Rml_list]

run List.fold_right2 p [a1; ...; an] [b1; ...; bn] c is run p a1 b1 (run p a2 b2 (... (run p an bn c) ...)).

fold_right2 [List]

List.fold_right2 f [a1; ...; an] [b1; ...; bn] c is f a1 b1 (f a2 b2 (... (f an bn c) ...)).

for_all [List]

for_all p [a1; ...; an] checks if all elements of the list satisfy the predicate p.

for_all2 [List]

Same as List.for_all, but for a two-argument predicate.

force [Lazy]

force x forces the suspension x and returns its result.

force_newline [Format]

Forces a newline in the current box.

force_val [Lazy]

force_val x forces the suspension x and returns its result.

foreground [Graphics]

Default background and foreground colors (usually, either black foreground on a white background or white foreground on a black background).

fork [Unix]

Fork a new process.

format_of_string [Stdlib]

format_of_string s returns a format string read from the string literal s.

formatter_of_buffer [Format]

formatter_of_buffer b returns a new formatter writing to buffer b.

formatter_of_out_channel [Format]

formatter_of_out_channel oc returns a new formatter that writes to the corresponding channel oc.

forward_tag [Obj]
fprintf [Printf]

fprintf outchan format arg1 ... argN formats the arguments arg1 to argN according to the format string format, and outputs the resulting string on the channel outchan.

fprintf [Format]

fprintf ff format arg1 ... argN formats the arguments arg1 to argN according to the format string format, and outputs the resulting string on the formatter ff.

frexp [Stdlib]

frexp f returns the pair of the significant and the exponent of f.

from [Stream]

Stream.from f returns a stream built from the function f.

from_channel [Marshal]

Marshal.from_channel chan reads from channel chan the byte representation of a structured value, as produced by one of the Marshal.to_* functions, and reconstructs and returns the corresponding value.

from_channel [Lexing]

Create a lexer buffer on the given input channel.

from_function [Lexing]

Create a lexer buffer with the given function as its reading method.

from_string [Marshal]

Marshal.from_string buff ofs unmarshals a structured value like Marshal.from_channel does, except that the byte representation is not read from a channel, but taken from the string buff, starting at position ofs.

from_string [Lexing]

Create a lexer buffer which reads from the given string.

fst [Stdlib]

Return the first component of a pair.

fstat [Unix]

Return the information for the file associated with the given descriptor.

ftruncate [Unix]

Truncates the file corresponding to the given descriptor to the given size.

full_init [Random]

Same as Random.init but takes more data as seed.

full_major [Gc]

Do a minor collection, finish the current major collection cycle, and perform a complete new cycle.

full_split [Str]

Same as Str.split_delim, but returns the delimiters as well as the substrings contained between delimiters.

G
get [Weak]

Weak.get ar n returns None if the nth cell of ar is empty, Some x (where x is the value) if it is full.

get [String]

String.get s n returns character number n in string s.

get [Bytes]

get s n returns the byte at index n in argument s.

get [Array]

Array.get a n returns the element number n of array a.

get_all_formatter_output_functions [Format]

Return the current output functions of the pretty-printer, including line breaking and indentation functions.

get_copy [Weak]

Weak.get_copy ar n returns None if the nth cell of ar is empty, Some x (where x is a (shallow) copy of the value) if it is full.

get_ellipsis_text [Format]

Return the text of the ellipsis.

get_formatter_output_functions [Format]

Return the current output functions of the pretty-printer.

get_formatter_tag_functions [Format]

Return the current tag functions of the pretty-printer.

get_image [Graphics]

Capture the contents of a rectangle on the screen as an image.

get_margin [Format]

Returns the position of the right margin.

get_mark_tags [Format]

Return the current status of tags printing and tags marking.

get_max_boxes [Format]

Returns the maximum number of boxes allowed before ellipsis.

get_max_indent [Format]

Return the value of the maximum indentation limit (in characters).

get_print_tags [Format]
getaddrinfo [Unix]

getaddrinfo host service opts returns a list of Unix.addr_info records describing socket parameters and addresses suitable for communicating with the given host and service.

getcwd [Unix]

Return the name of the current working directory.

getcwd [Sys]

Return the current working directory of the process.

getegid [Unix]

Return the effective group id under which the process runs.

getenv [Unix]

Return the value associated to a variable in the process environment, unless the process has special privileges.

getenv [Sys]

Return the value associated to a variable in the process environment.

geteuid [Unix]

Return the effective user id under which the process runs.

getgid [Unix]

Return the group id of the user executing the process.

getgrgid [Unix]

Find an entry in group with the given group id.

getgrnam [Unix]

Find an entry in group with the given name.

getgroups [Unix]

Return the list of groups to which the user executing the process belongs.

gethostbyaddr [Unix]

Find an entry in hosts with the given address.

gethostbyname [Unix]

Find an entry in hosts with the given name.

gethostname [Unix]

Return the name of the local host.

getitimer [Unix]

Return the current status of the given interval timer.

getlogin [Unix]

Return the login name of the user executing the process.

getnameinfo [Unix]

getnameinfo addr opts returns the host name and service name corresponding to the socket address addr.

getpeername [Unix]

Return the address of the host connected to the given socket.

getpid [Unix]

Return the pid of the process.

getppid [Unix]

Return the pid of the parent process.

getprotobyname [Unix]

Find an entry in protocols with the given name.

getprotobynumber [Unix]

Find an entry in protocols with the given protocol number.

getpwnam [Unix]

Find an entry in passwd with the given name.

getpwuid [Unix]

Find an entry in passwd with the given user id.

getservbyname [Unix]

Find an entry in services with the given name.

getservbyport [Unix]

Find an entry in services with the given service number.

getsockname [Unix]

Return the address of the given socket.

getsockopt [Unix]

Return the current status of a boolean-valued option in the given socket.

getsockopt_error [Unix]

Return the error condition associated with the given socket, and clear it.

getsockopt_float [Unix]

Same as Unix.getsockopt for a socket option whose value is a floating-point number.

getsockopt_int [Unix]

Same as Unix.getsockopt for an integer-valued socket option.

getsockopt_optint [Unix]

Same as Unix.getsockopt for a socket option whose value is an int option.

gettimeofday [Unix]

Same as Unix.time, but with resolution better than 1 second.

getuid [Unix]

Return the user id of the user executing the process.

global_replace [Str]

global_replace regexp templ s returns a string identical to s, except that all substrings of s that match regexp have been replaced by templ.

global_substitute [Str]

global_substitute regexp subst s returns a string identical to s, except that all substrings of s that match regexp have been replaced by the result of function subst.

gmtime [Unix]

Convert a time in seconds, as returned by Unix.time, into a date and a time.

green [Graphics]
group_beginning [Str]

group_beginning n returns the position of the first character of the substring that was matched by the nth group of the regular expression.

group_end [Str]

group_end n returns the position of the character following the last character of substring that was matched by the nth group of the regular expression.

H
handle_unix_error [Unix]

handle_unix_error f x applies f to x and returns the result.

has_symlink [Unix]

Returns true if the user is able to create symbolic links.

hash [Hashtbl]
hd [List]

Return the first element of the given list.

header_size [Marshal]

The bytes representing a marshaled value are composed of a fixed-size header and a variable-sized data part, whose size can be determined from the header.

I
i [Complex]

The complex number i.

ignore [Stdlib]

Discard the value of its argument and return ().

in_channel_length [Stdlib]

Return the total length (number of characters) of the given channel.

in_channel_of_descr [Unix]

Create an input channel reading from the given descriptor.

incr [Stdlib]

Increment the integer contained in the given reference.

index [String]

String.index s c returns the position of the leftmost occurrence of character c in string s.

index [Bytes]

index s c returns the index of the first occurrence of byte c in s.

index_from [String]

Same as String.index, but start searching at the character position given as second argument.

index_from [Bytes]

index_from s i c returns the index of the first occurrence of byte c in s after position i.

index_from_opt [Bytes]

index_from _opts i c returns the index of the first occurrence of byte c in s after position i or None if c does not occur in s after position i.

index_opt [Bytes]

index_opt s c returns the index of the first occurrence of byte c in s or None if c does not occur in s.

inet6_addr_any [Unix]

A special IPv6 address, for use only with bind, representing all the Internet addresses that the host machine possesses.

inet6_addr_loopback [Unix]

A special IPv6 address representing the host machine (::1).

inet_addr_any [Unix]

A special IPv4 address, for use only with bind, representing all the Internet addresses that the host machine possesses.

inet_addr_loopback [Unix]

A special IPv4 address representing the host machine (127.0.0.1).

inet_addr_of_string [Unix]

Conversion from the printable representation of an Internet address to its internal representation.

infinity [Stdlib]

Positive infinity.

infix_tag [Obj]
init [Random]

Initialize the generator, using the argument as a seed.

init [Bytes]

Bytes.init n f returns a fresh byte sequence of length n, with character i initialized to the result of f i (in increasing index order).

init [Array]

Array.init n f returns a fresh array of length n, with element number i initialized to the result of f i.

initgroups [Unix]

initgroups user group initializes the group access list by reading the group database /etc/group and using all groups of which user is a member.

input [Stdlib]

input ic buf pos len reads up to len characters from the given channel ic, storing them in string buf, starting at character number pos.

input [Digest]

Read a digest from the given input channel.

input_binary_int [Stdlib]

Read an integer encoded in binary format from the given input channel.

input_byte [Stdlib]

Same as Stdlib.input_char, but return the 8-bit integer representing the character.

input_char [Stdlib]

Read one character from the given input channel.

input_line [Stdlib]

Read characters from the given input channel, until a newline character is encountered.

input_value [Stdlib]

Read the representation of a structured value, as produced by Stdlib.output_value, and return the corresponding value.

int [Random]

Random.int bound returns a random integer between 0 (inclusive) and bound (exclusive).

int_of_char [Stdlib]

Return the ASCII code of the argument.

int_of_float [Stdlib]

Truncate the given floating-point number to an integer.

int_of_string [Stdlib]

Convert the given string to an integer.

interactive [Sys]

This reference is initially set to false in standalone programs and to true if the code is being executed under the interactive toplevel system ocaml.

inv [Complex]

Multiplicative inverse (1/z).

invalid_arg [Stdlib]

Raise exception Invalid_argument with the given string.

is_block [Obj]
is_empty [Stack]

Return true if the given stack is empty, false otherwise.

is_empty [Queue]

Return true if the given queue is empty, false otherwise.

is_implicit [Filename]

Return true if the file name is relative and does not start with an explicit reference to the current directory (./ or ../ in Unix), false if it starts with an explicit reference to the root directory or the current directory.

is_int [Obj]
is_relative [Filename]

Return true if the file name is relative to the current directory, false if it is absolute (i.e.

isatty [Unix]

Return true if the given file descriptor refers to a terminal or console window, false otherwise.

iter [String]

String.iter f s applies function f in turn to all the characters of s.

iter [Stream]

Stream.iter f s scans the whole stream s, applying function f in turn to each stream element encountered.

iter [Stack]

iter f s applies f in turn to all elements of s, from the element at the top of the stack to the element at the bottom of the stack.

iter [Rml_list]

run Rml_list.iter p [a1; ...; an] applies process p in turn to a1; ...; an.

iter [Queue]

iter f q applies f in turn to all elements of q, from the least recently entered to the most recently entered.

iter [List]

List.iter f [a1; ...; an] applies function f in turn to a1; ...; an.

iter [Hashtbl]

Hashtbl.iter f tbl applies f to all bindings in table tbl.

iter [Bytes]

iter f s applies function f in turn to all the bytes of s.

iter [Array]

Array.iter f a applies function f in turn to all the elements of a.

iter2 [Rml_list]

run Rml_list.iter2 p [a1; ...; an] applies process p in turn to a1; ...; an and b1; ...; bn.

iter2 [List]

List.iter2 f [a1; ...; an] [b1; ...; bn] calls in turn f a1 b1; ...; f an bn.

iteri [Bytes]

Same as Bytes.iter, but the function is applied to the index of the byte as first argument and the byte itself as second argument.

iteri [Array]

Same as Array.iter, but the function is applied to the index of the element as first argument, and the element itself as second argument.

J
junk [Stream]

Remove the first element of the stream, possibly unfreezing it before.

K
key_pressed [Graphics]

Return true if a keypress is available; that is, if read_key would not block.

kfprintf [Format]

Same as fprintf above, but instead of returning immediately, passes the formatter to its first argument at the end of printing.

kill [Unix]

kill pid sig sends signal number sig to the process with id pid.

kill [Rml_process_manager]

Signal gathering the killing orders.

killable [Rml_process_manager]

run killable p associates an id to the process p and executes it.

kprintf [Printf]

kprintf k format arguments is the same as sprintf format arguments, except that the resulting string is passed as argument to k; the result of k is then returned as the result of kprintf.

kprintf [Format]

A deprecated synonym for ksprintf.

ksprintf [Format]

Same as sprintf above, but instead of returning the string, passes it to the first argument.

L
last_chars [Str]

last_chars s n returns the last n characters of s.

lazy_from_fun [Lazy]

lazy_from_fun f is the same as lazy (f ()) but slightly more efficient.

lazy_from_val [Lazy]

lazy_from_val v returns an already-forced suspension of v This is for special purposes only and should not be confused with lazy (v).

lazy_is_val [Lazy]

lazy_is_val x returns true if x has already been forced and did not raise an exception.

lazy_tag [Obj]
ldexp [Stdlib]

ldexp x n returns x *. 2 ** n.

length [Weak]

Weak.length ar returns the length (number of elements) of ar.

length [String]

Return the length (number of characters) of the given string.

length [Stack]

Return the number of elements in a stack.

length [Queue]

Return the number of elements in a queue.

length [List]

Return the length (number of elements) of the given list.

length [Bytes]

Return the length (number of bytes) of the argument.

length [Buffer]

Return the number of characters currently contained in the buffer.

length [Array]

Return the length (number of elements) of the given array.

lexeme [Lexing]

Lexing.lexeme lexbuf returns the string matched by the regular expression.

lexeme_char [Lexing]

Lexing.lexeme_char lexbuf i returns character number i in the matched string.

lexeme_end [Lexing]

Lexing.lexeme_end lexbuf returns the offset in the input stream of the character following the last character of the matched string.

lexeme_end_p [Lexing]

Like lexeme_end, but return a complete position instead of an offset.

lexeme_start [Lexing]

Lexing.lexeme_start lexbuf returns the offset in the input stream of the first character of the matched string.

lexeme_start_p [Lexing]

Like lexeme_start, but return a complete position instead of an offset.

lineto [Graphics]

Draw a line with endpoints the current point and the given point, and move the current point to the given point.

link [Unix]

link source dest creates a hard link named dest to the file named source.

list [Sort]

Sort a list in increasing order according to an ordering predicate.

listen [Unix]

Set up a socket for receiving connection requests.

lnot [Stdlib]

Bitwise logical negation.

localtime [Unix]

Convert a time in seconds, as returned by Unix.time, into a date and a time.

lockf [Unix]

lockf fd cmd size puts a lock on a region of the file opened as fd.

log [Stdlib]

Natural logarithm.

log [Complex]

Natural logarithm (in base e).

log10 [Stdlib]

Base 10 logarithm.

logand [Nativeint]

Bitwise logical and.

logand [Int64]

Bitwise logical and.

logand [Int32]

Bitwise logical and.

lognot [Nativeint]

Bitwise logical negation

lognot [Int64]

Bitwise logical negation

lognot [Int32]

Bitwise logical negation

logor [Nativeint]

Bitwise logical or.

logor [Int64]

Bitwise logical or.

logor [Int32]

Bitwise logical or.

logxor [Nativeint]

Bitwise logical exclusive or.

logxor [Int64]

Bitwise logical exclusive or.

logxor [Int32]

Bitwise logical exclusive or.

lowercase [String]

Return a copy of the argument, with all uppercase letters translated to lowercase, including accented letters of the ISO Latin-1 (8859-1) character set.

lowercase [Char]

Convert the given character to its equivalent lowercase character.

lowercase [Bytes]
lowercase_ascii [Bytes]

Return a copy of the argument, with all uppercase letters translated to lowercase, using the US-ASCII character set.

lseek [Unix]

Set the current position for a file descriptor, and return the resulting offset (from the beginning of the file).

lstat [Unix]

Same as Unix.stat, but in case the file is a symbolic link, return the information for the link itself.

M
magenta [Graphics]
magic [Obj]
major [Gc]

Do a minor collection and finish the current major collection cycle.

major_slice [Gc]

Do a minor collection and a slice of major collection.

make [String]

String.make n c returns a fresh string of length n, filled with the character c.

make [Luc4ocaml_nolbl]
make [Luc4ocaml]

Builds the initial state of the Lucky machine

make [Bytes]

make n c returns a new byte sequence of length n, filled with the byte c.

make [Array]

Array.make n x returns a fresh array of length n, initialized with x.

make_formatter [Format]

make_formatter out flush returns a new formatter that writes according to the output function out, and the flushing function flush.

make_image [Graphics]

Convert the given color matrix to an image.

make_lexer [Genlex]

Construct the lexer function.

make_matrix [Array]

Array.make_matrix dimx dimy e returns a two-dimensional array (an array of arrays) with first dimension dimx and second dimension dimy.

map [Rml_list]

run Rml_list.map p [a1; ...; an] applies process p to a1, ..., an, and builds the list [run p a1; ...; run p an] with the results returned by p.

map [List]

List.map f [a1; ...; an] applies function f to a1, ..., an, and builds the list [f a1; ...; f an] with the results returned by f.

map [Bytes]

map f s applies function f in turn to all the bytes of s (in increasing index order) and stores the resulting bytes in a new sequence that is returned as the result.

map [Array]

Array.map f a applies function f to all the elements of a, and builds an array with the results returned by f: [| f a.(0); f a.(1); ...; f a.(Array.length a - 1) |].

map2 [Rml_list]

run Rml_list.map2 p [a1; ...; an] [b1; ...; bn] is [run p a1 b1; ...; run p an bn].

map2 [List]

List.map2 f [a1; ...; an] [b1; ...; bn] is [f a1 b1; ...; f an bn].

map_file [Unix]

Memory mapping of a file as a big array.

mapi [Bytes]

mapi f s calls f with each character of s and its index (in increasing index order) and stores the resulting bytes in a new sequence that is returned as the result.

mapi [Array]

Same as Array.map, but the function is applied to the index of the element as first argument, and the element itself as second argument.

marshal [Obj]
match_beginning [Str]

match_beginning() returns the position of the first character of the substring that was matched by Str.string_match, Str.search_forward or Str.search_backward.

match_end [Str]

match_end() returns the position of the character following the last character of the substring that was matched by string_match, search_forward or search_backward.

matched_group [Str]

matched_group n s returns the substring of s that was matched by the nth group \(...\) of the regular expression during the latest Str.string_match, Str.search_forward or Str.search_backward.

matched_string [Str]

matched_string s returns the substring of s that was matched by the latest Str.string_match, Str.search_forward or Str.search_backward.

max [Stdlib]

Return the greater of the two arguments.

max_array_length [Sys]

Maximum length of an array.

max_float [Stdlib]

The largest positive finite value of type float.

max_int [Stdlib]

The greatest representable integer.

max_int [Nativeint]

The greatest representable native integer, either 231 - 1 on a 32-bit platform, or 263 - 1 on a 64-bit platform.

max_int [Int64]

The greatest representable 64-bit integer, 263 - 1.

max_int [Int32]

The greatest representable 32-bit integer, 231 - 1.

max_string_length [Sys]

Maximum length of a string.

mem [List]

mem a l is true if and only if a is equal to an element of l.

mem [Hashtbl]

Hashtbl.mem tbl x checks if x is bound in tbl.

mem_assoc [List]

Same as List.assoc, but simply return true if a binding exists, and false if no bindings exist for the given key.

mem_assq [List]

Same as List.mem_assoc, but uses physical equality instead of structural equality to compare keys.

memq [List]

Same as List.mem, but uses physical equality instead of structural equality to compare list elements.

merge [Sort]

Merge two lists according to the given predicate.

merge [List]

Merge two lists: Assuming that l1 and l2 are sorted according to the comparison function cmp, merge cmp l1 l2 will return a sorted list containting all the elements of l1 and l2.

min [Stdlib]

Return the smaller of the two arguments.

min_float [Stdlib]

The smallest positive, non-zero, non-denormalized value of type float.

min_int [Stdlib]

The smallest representable integer.

min_int [Nativeint]

The greatest representable native integer, either -231 on a 32-bit platform, or -263 on a 64-bit platform.

min_int [Int64]

The smallest representable 64-bit integer, -263.

min_int [Int32]

The smallest representable 32-bit integer, -231.

minor [Gc]

Trigger a minor collection.

minus_one [Nativeint]

The native integer -1.

minus_one [Int64]

The 64-bit integer -1.

minus_one [Int32]

The 32-bit integer -1.

mkdir [Unix]

Create a directory with the given permissions (see Unix.umask).

mkfifo [Unix]

Create a named pipe with the given permissions (see Unix.umask).

mktime [Unix]

Convert a date and time, specified by the tm argument, into a time in seconds, as returned by Unix.time.

mod_float [Stdlib]

mod_float a b returns the remainder of a with respect to b.

modf [Stdlib]

modf f returns the pair of the fractional and integral part of f.

mouse_pos [Graphics]

Return the position of the mouse cursor, relative to the graphics window.

moveto [Graphics]

Position the current point.

mul [Nativeint]

Multiplication.

mul [Int64]

Multiplication.

mul [Int32]

Multiplication.

mul [Complex]

Multiplication

N
nan [Stdlib]

A special floating-point value denoting the result of an undefined operation such as 0.0 /. 0.0.

neg [Nativeint]

Unary negation.

neg [Int64]

Unary negation.

neg [Int32]

Unary negation.

neg [Complex]

Unary negation.

neg_infinity [Stdlib]

Negative infinity.

new_block [Obj]
new_line [Lexing]

Update the lex_curr_p field of the lexbuf to reflect the start of a new line.

next [Stream]

Return the first element of the stream and remove it from the stream.

nice [Unix]

Change the process priority.

no_scan_tag [Obj]
norm [Complex]

Norm: given x + i.y, returns sqrt(x^2 + y^2).

norm2 [Complex]

Norm squared: given x + i.y, returns x^2 + y^2.

not [Stdlib]

The boolean negation.

npeek [Stream]

npeek n returns the list of the n first elements of the stream, or all its remaining elements if less than n elements are available.

nth [List]

Return the n-th element of the given list.

nth [Buffer]

get the n-th character of the buffer.

O
obj [Obj]
object_tag [Obj]
ocaml_version [Sys]

ocaml_version is the version of Objective Caml.

of_channel [Stream]

Return the stream of the characters read from the input channel.

of_float [Nativeint]

Convert the given floating-point number to a native integer, discarding the fractional part (truncate towards 0).

of_float [Int64]

Convert the given floating-point number to a 64-bit integer, discarding the fractional part (truncate towards 0).

of_float [Int32]

Convert the given floating-point number to a 32-bit integer, discarding the fractional part (truncate towards 0).

of_int [Nativeint]

Convert the given integer (type int) to a native integer (type nativeint).

of_int [Int64]

Convert the given integer (type int) to a 64-bit integer (type int64).

of_int [Int32]

Convert the given integer (type int) to a 32-bit integer (type int32).

of_int32 [Nativeint]

Convert the given 32-bit integer (type int32) to a native integer.

of_int32 [Int64]

Convert the given 32-bit integer (type int32) to a 64-bit integer (type int64).

of_list [Stream]

Return the stream holding the elements of the list in the same order.

of_list [Array]

Array.of_list l returns a fresh array containing the elements of l.

of_nativeint [Int64]

Convert the given native integer (type nativeint) to a 64-bit integer (type int64).

of_string [Stream]

Return the stream of the characters of the string parameter.

of_string [Nativeint]

Convert the given string to a native integer.

of_string [Int64]

Convert the given string to a 64-bit integer.

of_string [Int32]

Convert the given string to a 32-bit integer.

of_string [Bytes]

Return a new byte sequence that contains the same bytes as the given string.

open_box [Format]

open_box d opens a new pretty-printing box with offset d.

open_connection [Unix]

Connect to a server at the given address.

open_graph [Graphics]

Show the graphics window or switch the screen to graphic mode.

open_hbox [Format]

open_hbox () opens a new pretty-printing box.

open_hovbox [Format]

open_hovbox d opens a new pretty-printing box with offset d.

open_hvbox [Format]

open_hvbox d opens a new pretty-printing box with offset d.

open_in [Stdlib]

Open the named file for reading, and return a new input channel on that file, positionned at the beginning of the file.

open_in_bin [Stdlib]

Same as Stdlib.open_in, but the file is opened in binary mode, so that no translation takes place during reads.

open_in_gen [Stdlib]

Open the named file for reading, as above.

open_out [Stdlib]

Open the named file for writing, and return a new output channel on that file, positionned at the beginning of the file.

open_out_bin [Stdlib]

Same as Stdlib.open_out, but the file is opened in binary mode, so that no translation takes place during writes.

open_out_gen [Stdlib]

Open the named file for writing, as above.

open_process [Unix]

Same as Unix.open_process_out, but redirects both the standard input and standard output of the command to pipes connected to the two returned channels.

open_process_full [Unix]

Similar to Unix.open_process, but the second argument specifies the environment passed to the command.

open_process_in [Unix]

High-level pipe and process management.

open_process_out [Unix]

Same as Unix.open_process_in, but redirect the standard input of the command to a pipe.

open_tag [Format]

open_tag t opens the tag named t; the print_open_tag function of the formatter is called with t as argument; the tag marker mark_open_tag t will be flushed into the output device of the formatter.

open_tbox [Format]

Opens a tabulation box.

open_temp_file [Filename]

Same as Filename.temp_file, but returns both the name of a fresh temporary file, and an output channel opened (atomically) on this file.

open_vbox [Format]

open_vbox d opens a new pretty-printing box with offset d.

opendir [Unix]

Open a descriptor on a directory

openfile [Unix]

Open the named file with the given flags.

os_type [Sys]

Operating system currently executing the Caml program.

out_channel_length [Stdlib]

Return the total length (number of characters) of the given channel.

out_channel_of_descr [Unix]

Create an output channel writing on the given descriptor.

output [Stdlib]

output oc buf pos len writes len characters from string buf, starting at offset pos, to the given output channel oc.

output [Digest]

Write a digest on the given output channel.

output_binary_int [Stdlib]

Write one integer in binary format on the given output channel.

output_buffer [Buffer]

output_buffer oc b writes the current contents of buffer b on the output channel oc.

output_byte [Stdlib]

Write one 8-bit integer (as the single character with that code) on the given output channel.

output_char [Stdlib]

Write the character on the given output channel.

output_string [Stdlib]

Write the string on the given output channel.

output_value [Stdlib]

Write the representation of a structured value of any type to a channel.

over_max_boxes [Format]

Tests if the maximum number of boxes allowed have already been opened.

P
par_iter [Rml_list]

run Rml_list.par_iter p [a1; ...; an] applies process p in parallel to a1; ...; an.

par_iter2 [Rml_list]

run Rml_list.par_iter2 p [a1; ...; an] applies process p in parallel to a1; ...; an and b1; ...; bn.

par_map [Rml_list]

run Rml_list.map p [a1; ...; an] applies process p to a1, ..., an in parallel, and builds the list [run p a1; ...; run p an] with the results returned by p.

par_map2 [Rml_list]

run Rml_list.map2 p [a1; ...; an] [b1; ...; bn] is [run p a1 b1; ...; run p an bn] and runs the processes in paralell.

parent_dir_name [Filename]

The conventional name for the parent of the current directory (e.g.

parse [Arg]

Arg.parse speclist anon_fun usage_msg parses the command line.

parse_argv [Arg]

Arg.parse_argv ~current args speclist anon_fun usage_msg parses the array args as if it were the command line.

parse_argv_dynamic [Arg]

Same as Arg.parse_argv, except that the speclist argument is a reference and may be updated during the parsing.

parse_dynamic [Arg]

Same as Arg.parse, except that the speclist argument is a reference and may be updated during the parsing.

partition [List]

partition p l returns a pair of lists (l1, l2), where l1 is the list of all the elements of l that satisfy the predicate p, and l2 is the list of all the elements of l that do not satisfy p.

peek [Stream]

Return Some of "the first element" of the stream, or None if the stream is empty.

peek [Queue]

peek q returns the first element in queue q, without removing it from the queue, or raises Empty if the queue is empty.

pipe [Unix]

Create a pipe.

plot [Graphics]

Plot the given point with the current drawing color.

plots [Graphics]

Plot the given points with the current drawing color.

point_color [Graphics]

Return the color of the given point in the backing store (see "Double buffering" below).

polar [Complex]

polar norm arg returns the complex having norm norm and argument arg.

pop [Stack]

pop s removes and returns the topmost element in stack s, or raises Empty if the stack is empty.

pop [Queue]

pop is a synonym for take.

pos_in [Stdlib]

Return the current reading position for the given channel.

pos_out [Stdlib]

Return the current writing position for the given channel.

pow [Complex]

Power function.

pp_close_box [Format]
pp_close_tag [Format]
pp_close_tbox [Format]
pp_force_newline [Format]
pp_get_all_formatter_output_functions [Format]
pp_get_ellipsis_text [Format]
pp_get_formatter_output_functions [Format]
pp_get_formatter_tag_functions [Format]

These functions are the basic ones: usual functions operating on the standard formatter are defined via partial evaluation of these primitives.

pp_get_margin [Format]
pp_get_mark_tags [Format]
pp_get_max_boxes [Format]
pp_get_max_indent [Format]
pp_get_print_tags [Format]
pp_open_box [Format]
pp_open_hbox [Format]
pp_open_hovbox [Format]
pp_open_hvbox [Format]
pp_open_tag [Format]
pp_open_tbox [Format]
pp_open_vbox [Format]
pp_over_max_boxes [Format]
pp_print_as [Format]
pp_print_bool [Format]
pp_print_break [Format]
pp_print_char [Format]
pp_print_cut [Format]
pp_print_float [Format]
pp_print_flush [Format]
pp_print_if_newline [Format]
pp_print_int [Format]
pp_print_newline [Format]
pp_print_space [Format]
pp_print_string [Format]
pp_print_tab [Format]
pp_print_tbreak [Format]
pp_set_all_formatter_output_functions [Format]
pp_set_ellipsis_text [Format]
pp_set_formatter_out_channel [Format]
pp_set_formatter_output_functions [Format]
pp_set_formatter_tag_functions [Format]
pp_set_margin [Format]
pp_set_mark_tags [Format]
pp_set_max_boxes [Format]
pp_set_max_indent [Format]
pp_set_print_tags [Format]
pp_set_tab [Format]
pp_set_tags [Format]
pred [Stdlib]

pred x is x-1.

pred [Nativeint]

Predecessor.

pred [Int64]

Predecessor.

pred [Int32]

Predecessor.

prerr_char [Stdlib]

Print a character on standard error.

prerr_endline [Stdlib]

Print a string, followed by a newline character on standard error and flush standard error.

prerr_float [Stdlib]

Print a floating-point number, in decimal, on standard error.

prerr_int [Stdlib]

Print an integer, in decimal, on standard error.

prerr_newline [Stdlib]

Print a newline character on standard error, and flush standard error.

prerr_string [Stdlib]

Print a string on standard error.

print [Printexc]

Printexc.print fn x applies fn to x and returns the result.

print_as [Format]

print_as len str prints str in the current box.

print_bool [Format]

Prints a boolean in the current box.

print_break [Format]

Inserts a break hint in a pretty-printing box.

print_char [Stdlib]

Print a character on standard output.

print_char [Format]

Prints a character in the current box.

print_cut [Format]

print_cut () is used to mark a good break position.

print_endline [Stdlib]

Print a string, followed by a newline character, on standard output and flush standard output.

print_float [Stdlib]

Print a floating-point number, in decimal, on standard output.

print_float [Format]

Prints a floating point number in the current box.

print_flush [Format]

Flushes the pretty printer: all opened boxes are closed, and all pending text is displayed.

print_if_newline [Format]

Executes the next formatting command if the preceding line has just been split.

print_int [Stdlib]

Print an integer, in decimal, on standard output.

print_int [Format]

Prints an integer in the current box.

print_newline [Stdlib]

Print a newline character on standard output, and flush standard output.

print_newline [Format]

Equivalent to print_flush followed by a new line.

print_space [Format]

print_space () is used to separate items (typically to print a space between two words).

print_stat [Gc]

Print the current values of the memory management counters (in human-readable form) into the channel argument.

print_string [Stdlib]

Print a string on standard output.

print_string [Format]

print_string str prints str in the current box.

print_tab [Format]

print_tab () is equivalent to print_tbreak (0,0).

print_tbreak [Format]

Break hint in a tabulation box.

printf [Printf]

Same as Printf.fprintf, but output on stdout.

printf [Format]

Same as fprintf above, but output on std_formatter.

proc_of_fun [Rml_async]

run proc_of_fun f x executes f x in a thread.

ps [Rml_process_manager]

Display the list of running processes with their behaviors: k: killable, s: suspendable, r: resetable, c: changeable, x: extensible

push [Stack]

push x s adds the element x at the top of stack s.

push [Queue]

push is a synonym for add.

putenv [Unix]

Unix.putenv name value sets the value associated to a variable in the process environment.

Q
quick_stat [Gc]

Same as stat except that live_words, live_blocks, free_words, free_blocks, largest_free, and fragments are set to 0.

quote [Str]

Str.quote s returns a regexp string that matches exactly s and nothing else.

quote [Filename]

Return a quoted version of a file name, suitable for use as one argument in a shell command line, escaping all shell meta-characters.

R
raise [Stdlib]

Raise the given exception value

rcontains_from [String]

String.rcontains_from s stop c tests if character c appears in the substring of s starting from the beginning of s to index stop.

rcontains_from [Bytes]

rcontains_from s stop c tests if byte c appears in s before position stop+1.

read [Unix]

read fd buff ofs len reads len bytes from descriptor fd, storing them in byte sequence buff, starting at position ofs in buff.

read_float [Stdlib]

Flush standard output, then read one line from standard input and convert it to a floating-point number.

read_int [Stdlib]

Flush standard output, then read one line from standard input and convert it to an integer.

read_key [Graphics]

Wait for a key to be pressed, and return the corresponding character.

read_line [Stdlib]

Flush standard output, then read characters from standard input until a newline character is encountered.

readdir [Unix]

Return the next entry in a directory.

readdir [Sys]

Return the names of all files present in the given directory.

readlink [Unix]

Read the contents of a symbolic link.

really_input [Stdlib]

really_input ic buf pos len reads len characters from channel ic, storing them in string buf, starting at character number pos.

recv [Unix]

Receive data from a connected socket.

recvfrom [Unix]

Receive data from an unconnected socket.

red [Graphics]
ref [Stdlib]

Return a fresh reference containing the given value.

regexp [Str]

Compile a regular expression.

regexp_case_fold [Str]

Same as regexp, but the compiled expression will match text in a case-insensitive way: uppercase and lowercase letters will be considered equivalent.

regexp_string [Str]

Str.regexp_string s returns a regular expression that matches exactly s and nothing else.

regexp_string_case_fold [Str]

Str.regexp_string_case_fold is similar to Str.regexp_string, but the regexp matches in a case-insensitive way.

register [Callback]

Callback.register n v registers the value v under the name n.

register_exception [Callback]

Callback.register_exception n exn registers the exception contained in the exception value exn under the name n.

rem [Nativeint]

Integer remainder.

rem [Int64]

Integer remainder.

rem [Int32]

Integer remainder.

remember_mode [Graphics]

Set remember mode on or off.

remove [Sys]

Remove the given file name from the file system.

remove [Hashtbl]

Hashtbl.remove tbl x removes the current binding of x in tbl, restoring the previous binding if it exists.

remove_assoc [List]

remove_assoc a l returns the list of pairs l without the first pair with key a, if any.

remove_assq [List]

Same as List.remove_assoc, but uses physical equality instead of structural equality to compare keys.

rename [Unix]

rename old new changes the name of a file from old to new, moving it between directories if needed.

rename [Sys]

Rename a file.

replace [Hashtbl]

Hashtbl.replace tbl x y replaces the current binding of x in tbl by a binding of x to y.

replace_first [Str]

Same as Str.global_replace, except that only the first substring matching the regular expression is replaced.

replace_matched [Str]

replace_matched repl s returns the replacement text repl in which \1, \2, etc.

repr [Obj]
reset [Rml_process_manager]

Signal gathering the reseting orders.

reset [Buffer]

Empty the buffer and deallocate the internal string holding the buffer contents, replacing it with the initial internal string of length n that was allocated by Buffer.create n.

resetable [Rml_process_manager]

run resetable p associates an id to the process p and executes it.

resize_window [Graphics]

Resize and erase the graphics window.

rev [List]

List reversal.

rev_append [List]

List.rev_append l1 l2 reverses l1 and concatenates it to l2.

rev_map [Rml_list]

run Rml_List.rev_map p l gives the same result as List.rev (Rml_list.map p l), but is tail-recursive and more efficient.

rev_map [List]

List.rev_map f l gives the same result as List.rev (List.map f l), but is tail-recursive and more efficient.

rev_map2 [Rml_list]

run Rml_list.rev_map2 p l1 l2 gives the same result as List.rev (Rml_list.map2 p l1 l2), but is tail-recursive and more efficient.

rev_map2 [List]

List.rev_map2 f l gives the same result as List.rev (List.map2 f l), but is tail-recursive and more efficient.

rewinddir [Unix]

Reposition the descriptor to the beginning of the directory

rgb [Graphics]

rgb r g b returns the integer encoding the color with red component r, green component g, and blue component b.

rhs_end [Parsing]
rhs_end_pos [Parsing]

Same as rhs_end, but return a position instead of an offset.

rhs_start [Parsing]

Same as Parsing.symbol_start and Parsing.symbol_end, but return the offset of the string matching the nth item on the right-hand side of the rule, where n is the integer parameter to rhs_start and rhs_end.

rhs_start_pos [Parsing]

Same as rhs_start, but return a position instead of an offset.

rif_read [Luc4ocaml]

Reads from an in_channel Lucky inputs in RIF

rindex [String]

String.rindex s c returns the position of the rightmost occurrence of character c in string s.

rindex [Bytes]

rindex s c returns the index of the last occurrence of byte c in s.

rindex_from [String]

Same as String.rindex, but start searching at the character position given as second argument.

rindex_from [Bytes]

rindex_from s i c returns the index of the last occurrence of byte c in s before position i+1.

rindex_from_opt [Bytes]

rindex_from_opt s i c returns the index of the last occurrence of byte c in s before position i+1 or None if c does not occur in s before position i+1.

rindex_opt [Bytes]

rindex_opt s c returns the index of the last occurrence of byte c in s or None if c does not occur in s.

rlineto [Graphics]

Draw a line with endpoints the current point and the current point translated of the given vector, and move the current point to this point.

rmdir [Unix]

Remove an empty directory.

rmoveto [Graphics]

rmoveto dx dy translates the current point by the given vector.

S
safe_emit [Rml_async]

safe_emit s v will emit the value v on the signal s, but there is no guaranty on the instant of emission.

search_backward [Str]

search_backward r s last searches the string s for a substring matching the regular expression r.

search_forward [Str]

search_forward r s start searches the string s for a substring matching the regular expression r.

seek_in [Stdlib]

seek_in chan pos sets the current reading position to pos for channel chan.

seek_out [Stdlib]

seek_out chan pos sets the current writing position to pos for channel chan.

select [Unix]

Wait until some input/output operations become possible on some channels.

self_init [Random]

Initialize the generator with a more-or-less random seed chosen in a system-dependent way.

send [Unix]

Send data over a connected socket.

send_substring [Unix]

Same as send, but take the data from a string instead of a byte sequence.

sendto [Unix]

Send data over an unconnected socket.

sendto_substring [Unix]

Same as sendto, but take the data from a string instead of a byte sequence.

set [Weak]

Weak.set ar n (Some el) sets the nth cell of ar to be a (full) pointer to el; Weak.set ar n None sets the nth cell of ar to empty.

set [String]

String.set s n c modifies string s in place, replacing the character number n by c.

set [Bytes]

set s n c modifies s in place, replacing the byte at index n with c.

set [Array]

Array.set a n x modifies array a in place, replacing element number n with x.

set_all_formatter_output_functions [Format]

set_all_formatter_output_functions out flush outnewline outspace redirects the pretty-printer output to the functions out and flush as described in set_formatter_output_functions.

set_binary_mode_in [Stdlib]

set_binary_mode_in ic true sets the channel ic to binary mode: no translations take place during input.

set_binary_mode_out [Stdlib]

set_binary_mode_out oc true sets the channel oc to binary mode: no translations take place during output.

set_close_on_exec [Unix]

Set the ``close-on-exec'' flag on the given descriptor.

set_color [Graphics]

Set the current drawing color.

set_ellipsis_text [Format]

Set the text of the ellipsis printed when too many boxes are opened (a single dot, ., by default).

set_field [Obj]
set_font [Graphics]

Set the font used for drawing text.

set_formatter_out_channel [Format]

Redirect the pretty-printer output to the given channel.

set_formatter_output_functions [Format]

set_formatter_output_functions out flush redirects the pretty-printer output to the functions out and flush.

set_formatter_tag_functions [Format]
set_line_width [Graphics]

Set the width of points and lines drawn with the functions above.

set_margin [Format]

set_margin d sets the value of the right margin to d (in characters): this value is used to detect line overflows that leads to split lines.

set_mark_tags [Format]

set_print_tags b turns on or off the printing of tags, while set_mark_tags b turns on or off the output of tag markers.

set_max_boxes [Format]

set_max_boxes max sets the maximum number of boxes simultaneously opened.

set_max_indent [Format]

set_max_indent d sets the value of the maximum indentation limit to d (in characters): once this limit is reached, boxes are rejected to the left, if they do not fit on the current line.

set_nonblock [Unix]

Set the ``non-blocking'' flag on the given descriptor.

set_print_tags [Format]
set_signal [Sys]

Same as Sys.signal but return value is ignored.

set_tab [Format]

Sets a tabulation mark at the current insertion point.

set_tag [Obj]
set_tags [Format]

set_tags b turns on or off the treatment of tags (default is off).

set_text_size [Graphics]

Set the character size used for drawing text.

set_window_title [Graphics]

Set the title of the graphics window.

setgid [Unix]

Set the real group id and effective group id for the process.

setgroups [Unix]

setgroups groups sets the supplementary group IDs for the calling process.

setitimer [Unix]

setitimer t s sets the interval timer t and returns its previous status.

setsid [Unix]

Put the calling process in a new session and detach it from its controlling terminal.

setsockopt [Unix]

Set or clear a boolean-valued option in the given socket.

setsockopt_float [Unix]

Same as Unix.setsockopt for a socket option whose value is a floating-point number.

setsockopt_int [Unix]

Same as Unix.setsockopt for an integer-valued socket option.

setsockopt_optint [Unix]

Same as Unix.setsockopt for a socket option whose value is an int option.

setuid [Unix]

Set the real user id and effective user id for the process.

shift_left [Nativeint]

Nativeint.shift_left x y shifts x to the left by y bits.

shift_left [Int64]

Int64.shift_left x y shifts x to the left by y bits.

shift_left [Int32]

Int32.shift_left x y shifts x to the left by y bits.

shift_right [Nativeint]

Nativeint.shift_right x y shifts x to the right by y bits.

shift_right [Int64]

Int64.shift_right x y shifts x to the right by y bits.

shift_right [Int32]

Int32.shift_right x y shifts x to the right by y bits.

shift_right_logical [Nativeint]

Nativeint.shift_right_logical x y shifts x to the right by y bits.

shift_right_logical [Int64]

Int64.shift_right_logical x y shifts x to the right by y bits.

shift_right_logical [Int32]

Int32.shift_right_logical x y shifts x to the right by y bits.

shutdown [Unix]

Shutdown a socket connection.

shutdown_connection [Unix]

``Shut down'' a connection established with Unix.open_connection; that is, transmit an end-of-file condition to the server reading on the other side of the connection.

sigabrt [Sys]

Abnormal termination

sigalrm [Sys]

Timeout

sigchld [Sys]

Child process terminated

sigcont [Sys]

Continue

sigfpe [Sys]

Arithmetic exception

sighup [Sys]

Hangup on controlling terminal

sigill [Sys]

Invalid hardware instruction

sigint [Sys]

Interactive interrupt (ctrl-C)

sigkill [Sys]

Termination (cannot be ignored)

sigpending [Unix]

Return the set of blocked signals that are currently pending.

sigpipe [Sys]

Broken pipe

sigprocmask [Unix]

sigprocmask cmd sigs changes the set of blocked signals.

sigprof [Sys]

Profiling interrupt

sigquit [Sys]

Interactive termination

sigsegv [Sys]

Invalid memory reference

sigstop [Sys]

Stop

sigsuspend [Unix]

sigsuspend sigs atomically sets the blocked signals to sigs and waits for a non-ignored, non-blocked signal to be delivered.

sigterm [Sys]

Termination

sigtstp [Sys]

Interactive stop

sigttin [Sys]

Terminal read from background process

sigttou [Sys]

Terminal write from background process

sigusr1 [Sys]

Application-defined signal 1

sigusr2 [Sys]

Application-defined signal 2

sigvtalrm [Sys]

Timeout in virtual time

sin [Stdlib]
single_write [Unix]

Same as write, but attempts to write only once.

single_write_substring [Unix]

Same as single_write, but take the data from a string instead of a byte sequence.

sinh [Stdlib]
size [Obj]
size [Nativeint]

The size in bits of a native integer.

size_x [Graphics]
size_y [Graphics]

Return the size of the graphics window.

sleep [Unix]

Stop execution for the given number of seconds.

sleepf [Unix]

Stop execution for the given number of seconds.

snd [Stdlib]

Return the second component of a pair.

socket [Unix]

Create a new socket in the given domain, and with the given kind.

socketpair [Unix]

Create a pair of unnamed sockets, connected together.

sort [List]

Sort a list in increasing order according to a comparison function.

sort [Array]

Sort an array in increasing order according to a comparison function.

sound [Graphics]

sound freq dur plays a sound at frequency freq (in hertz) for a duration dur (in milliseconds).

split [Str]

split r s splits s into substrings, taking as delimiters the substrings that match r, and returns the list of substrings.

split [List]

Transform a list of pairs into a pair of lists: split [(a1,b1); ...; (an,bn)] is ([a1; ...; an], [b1; ...; bn]).

split_delim [Str]

Same as Str.split but occurrences of the delimiter at the beginning and at the end of the string are recognized and returned as empty strings in the result.

sprintf [Printf]

Same as Printf.fprintf, but instead of printing on an output channel, return a string containing the result of formatting the arguments.

sprintf [Format]

Same as printf above, but instead of printing on a formatter, returns a string containing the result of formatting the arguments.

sqrt [Stdlib]

Square root

sqrt [Complex]

Square root.

sr [Rml_process_manager]

Signal gathering the suspension and resumption orders.

stable_sort [List]

Same as List.sort, but the sorting algorithm is guaranteed to be stable (i.e.

stable_sort [Array]

Same as Array.sort, but the sorting algorithm is stable (i.e.

stat [Unix]

Return the information for the named file.

stat [Gc]

Return the current values of the memory management counters in a stat record.

std_formatter [Format]

The standard formatter used by the formatting functions above.

stdbuf [Format]

The string buffer in which str_formatter writes.

stderr [Unix]

File descriptor for standard error.

stderr [Stdlib]

The standard error ouput for the process.

stdin [Unix]

File descriptor for standard input.

stdin [Stdlib]

The standard input for the process.

stdout [Unix]

File descriptor for standard output.

stdout [Stdlib]

The standard output for the process.

step [Luc4ocaml_nolbl]
step [Luc4ocaml]

the default step mode is StepInside

step_se [Luc4ocaml_nolbl]
step_se [Luc4ocaml]

side-effect version of step

str_formatter [Format]

A formatter to use with formatting functions below for output to the stdbuf string buffer.

string [Digest]

Return the digest of the given string.

string_after [Str]

string_after s n returns the substring of all characters of s that follow position n (including the character at position n).

string_before [Str]

string_before s n returns the substring of all characters of s that precede position n (excluding the character at position n).

string_match [Str]

string_match r s start tests whether a substring of s that starts at position start matches the regular expression r.

string_of_bool [Stdlib]

Return the string representation of a boolean.

string_of_float [Stdlib]

Return the string representation of a floating-point number.

string_of_format [Stdlib]

Converts a format string into a string.

string_of_inet_addr [Unix]

Return the printable representation of the given Internet address.

string_of_int [Stdlib]

Return the string representation of an integer, in decimal.

string_of_value [Luc4ocaml]

Pretty-print

string_partial_match [Str]

Similar to Str.string_match, but also returns true if the argument string is a prefix of a string that matches.

string_tag [Obj]
sub [String]

String.sub s start len returns a fresh string of length len, containing the characters number start to start + len - 1 of string s.

sub [Nativeint]

Subtraction.

sub [Int64]

Subtraction.

sub [Int32]

Subtraction.

sub [Complex]

Subtraction

sub [Bytes]

sub s start len returns a new byte sequence of length len, containing the subsequence of s that starts at position start and has length len.

sub [Buffer]

Buffer.sub b off len returns (a copy of) the substring of the current contents of the buffer b starting at offset off of length len bytes.

sub [Array]

Array.sub a start len returns a fresh array of length len, containing the elements number start to start + len - 1 of array a.

sub_string [Bytes]

Same as sub but return a string instead of a byte sequence.

substitute_first [Str]

Same as Str.global_substitute, except that only the first substring matching the regular expression is replaced.

substring [Digest]

Digest.substring s ofs len returns the digest of the substring of s starting at character number ofs and containing len characters.

succ [Stdlib]

succ x is x+1.

succ [Nativeint]

Successor.

succ [Int64]

Successor.

succ [Int32]

Successor.

suspendable [Rml_process_manager]

run suspendable p associates an id to the process p and executes it.

symbol_end [Parsing]
symbol_end_pos [Parsing]

Same as symbol_end, but return a position instead of an offset.

symbol_start [Parsing]

symbol_start and Parsing.symbol_end are to be called in the action part of a grammar rule only.

symbol_start_pos [Parsing]

Same as symbol_start, but return a position instead of an offset.

symlink [Unix]

symlink ?to_dir source dest creates the file dest as a symbolic link to the file source.

synchronize [Graphics]

Synchronize the backing store and the on-screen window, by copying the contents of the backing store onto the graphics window.

system [Unix]

Execute the given command, wait until it terminates, and return its termination status.

T
tag [Obj]
take [Queue]

take q removes and returns the first element in queue q, or raises Empty if the queue is empty.

tan [Stdlib]
tanh [Stdlib]

The usual hyperbolic trigonometric functions.

tcdrain [Unix]

Waits until all output written on the given file descriptor has been transmitted.

tcflow [Unix]

Suspend or restart reception or transmission of data on the given file descriptor, depending on the second argument: TCOOFF suspends output, TCOON restarts output, TCIOFF transmits a STOP character to suspend input, and TCION transmits a START character to restart input.

tcflush [Unix]

Discard data written on the given file descriptor but not yet transmitted, or data received but not yet read, depending on the second argument: TCIFLUSH flushes data received but not read, TCOFLUSH flushes data written but not transmitted, and TCIOFLUSH flushes both.

tcgetattr [Unix]

Return the status of the terminal referred to by the given file descriptor.

tcsendbreak [Unix]

Send a break condition on the given file descriptor.

tcsetattr [Unix]

Set the status of the terminal referred to by the given file descriptor.

temp_file [Filename]

temp_file prefix suffix returns the name of a fresh temporary file in the temporary directory.

text_size [Graphics]

Return the dimensions of the given text, if it were drawn with the current font and size.

time [Unix]

Return the current time since 00:00:00 GMT, Jan.

time [Sys]

Return the processor time, in seconds, used by the program since the beginning of execution.

times [Unix]

Return the execution times of the process.

tl [List]

Return the given list without its first element.

to_buffer [Marshal]

Marshal.to_buffer buff ofs len v flags marshals the value v, storing its byte representation in the string buff, starting at character number ofs, and writing at most len characters.

to_channel [Marshal]

Marshal.to_channel chan v flags writes the representation of v on channel chan.

to_float [Nativeint]

Convert the given native integer to a floating-point number.

to_float [Int64]

Convert the given 64-bit integer to a floating-point number.

to_float [Int32]

Convert the given 32-bit integer to a floating-point number.

to_hex [Digest]

Return the printable hexadecimal representation of the given digest.

to_int [Nativeint]

Convert the given native integer (type nativeint) to an integer (type int).

to_int [Int64]

Convert the given 64-bit integer (type int64) to an integer (type int).

to_int [Int32]

Convert the given 32-bit integer (type int32) to an integer (type int).

to_int32 [Nativeint]

Convert the given native integer to a 32-bit integer (type int32).

to_int32 [Int64]

Convert the given 64-bit integer (type int64) to a 32-bit integer (type int32).

to_list [Array]

Array.to_list a returns the list of all the elements of a.

to_nativeint [Int64]

Convert the given 64-bit integer (type int64) to a native integer.

to_string [Printexc]

Printexc.to_string e returns a string representation of the exception e.

to_string [Nativeint]

Return the string representation of its argument, in decimal.

to_string [Marshal]

Marshal.to_string v flags returns a string containing the representation of v as a sequence of bytes.

to_string [Int64]

Return the string representation of its argument, in decimal.

to_string [Int32]

Return the string representation of its argument, in signed decimal.

to_string [Bytes]

Return a new string that contains the same bytes as the given byte sequence.

top [Stack]

top s returns the topmost element in stack s, or raises Empty if the stack is empty.

top [Queue]

top is a synonym for peek.

total_size [Marshal]
transfer [Queue]

transfer q1 q2 adds all of q1's elements at the end of the queue q2, then clears q1.

transp [Graphics]

In matrices of colors, this color represent a ``transparent'' point: when drawing the corresponding image, all pixels on the screen corresponding to a transparent pixel in the image will not be modified, while other points will be set to the color of the corresponding point in the image.

trim [Bytes]

Return a copy of the argument, without leading and trailing whitespace.

truncate [Unix]

Truncates the named file to the given size.

truncate [Stdlib]
truncate [Obj]
U
umask [Unix]

Set the process's file mode creation mask, and return the previous mask.

uncapitalize [String]

Return a copy of the argument, with the first letter set to lowercase.

uncapitalize [Bytes]
uncapitalize_ascii [Bytes]

Return a copy of the argument, with the first character set to lowercase, using the US-ASCII character set.

unlink [Unix]

Removes the named file.

unmarshal [Obj]
unsafe_environment [Unix]

Return the process environment, as an array of strings with the format ``variable=value''.

unsafe_getenv [Unix]

Return the value associated to a variable in the process environment.

unsafe_of_string [Bytes]

Unsafely convert a shared string to a byte sequence that should not be mutated.

unsafe_to_string [Bytes]

Unsafely convert a byte sequence into a string.

uppercase [String]

Return a copy of the argument, with all lowercase letters translated to uppercase, including accented letters of the ISO Latin-1 (8859-1) character set.

uppercase [Char]

Convert the given character to its equivalent uppercase character.

uppercase [Bytes]
uppercase_ascii [Bytes]

Return a copy of the argument, with all lowercase letters translated to uppercase, using the US-ASCII character set.

usage [Arg]

Arg.usage speclist usage_msg prints to standard error an error message that includes the list of valid options.

usage_string [Arg]

Returns the message that would have been printed by Arg.usage, if provided with the same parameters.

utimes [Unix]

Set the last access time (second arg) and last modification time (third arg) for a file.

W
wait [Unix]

Wait until one of the children processes die, and return its pid and termination status.

wait_next_event [Graphics]

Wait until one of the events specified in the given event list occurs, and return the status of the mouse and keyboard at that time.

waitpid [Unix]

Same as Unix.wait, but waits for the child process whose pid is given.

white [Graphics]
word_size [Sys]

Size of one word on the machine currently executing the Caml program, in bits: 32 or 64.

write [Unix]

write fd buff ofs len writes len bytes to descriptor fd, taking them from byte sequence buff, starting at position ofs in buff.

write_substring [Unix]

Same as write, but take the data from a string instead of a byte sequence.

Y
yellow [Graphics]
yield [Rml_async]

yield () re-schedules the calling thread without suspending it.

Z
zero [Nativeint]

The native integer 0.

zero [Int64]

The 64-bit integer 0.

zero [Int32]

The 32-bit integer 0.

zero [Complex]

The complex number 0.