Module Stream


module Stream = struct ... end 
Types
'a t The type of streams holding values of type 'a.
Abstract

Exceptions
Failure Raised by parsers when none of the first components of the stream patterns is accepted.
Error of  string
Raised by parsers when the first component of a stream pattern is accepted, but one of the following components is rejected.

Simple values
sempty 'b t

Functions

from : (int -> 'c option) -> 'c t
Stream.from f returns a stream built from the function f. To create a new stream element, the function f is called with the current stream count. The user function f must return either Some <value> for a value or None to specify the end of the stream.

of_list : 'd list -> 'd t
Return the stream holding the elements of the list in the same order.

of_string : string -> char t
Return the stream of the characters of the string parameter.

of_channel : Pervasives.in_channel -> char t
Return the stream of the characters read from the input channel.

iter : f:('e -> unit) -> 'e t -> unit
Stream.iter f s scans the whole stream s, applying function f in turn to each stream element encountered.

next : 'f t -> 'f
Return the first element of the stream and remove it from the stream. Raise Stream.Failure if the stream is empty.

empty : 'g t -> unit
Return () if the stream is empty, else raise Stream.Failure.

peek : 'h t -> 'h option
Return Some of "the first element" of the stream, or None if the stream is empty.

junk : 'i t -> unit
Remove the first element of the stream, possibly unfreezing it before.

count : 'j t -> int
Return the current count of the stream elements, i.e. the number of the stream elements discarded.

npeek : int -> 'k t -> 'k list
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.

iapp : 'l t -> 'l t -> 'l t

icons : 'm -> 'm t -> 'm t

ising : 'n -> 'n t

lapp : (unit -> 'o t) -> 'o t -> 'o t

lcons : (unit -> 'p) -> 'p t -> 'p t

lsing : (unit -> 'q) -> 'q t

slazy : (unit -> 'r t) -> 'r t

dump : ('s -> unit) -> 's t -> unit