module UTF32: sig
.. end
type
elt = Unicode.utf32_char
val sequence : fail:([> `illegal_sequence | `surrogate_fragment of int ] -> int) ->
elt -> int
val max_sequence : int
val is_trailing : elt -> bool
val decode3 : ('d -> 'e -> elt) ->
('d -> 'e -> 'e) ->
('d -> 'e -> bool) ->
('a -> 'b -> 'c -> 'd -> 'e -> 'e -> Stdlib.Uchar.t -> 'f) ->
fail:('a ->
'b -> 'c -> 'd -> 'e -> 'e -> [> Unicode.utf32_decode_error ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f
val decode : ('a -> 'b -> elt) ->
('a -> 'b -> 'b) ->
('a -> 'b -> bool) ->
('a -> 'b -> 'b -> Stdlib.Uchar.t -> 'c) ->
fail:('a -> 'b -> 'b -> [> Unicode.utf32_decode_error ] -> 'c) ->
'a -> 'b -> 'c
val encode4 : ('e -> 'f -> elt -> 'f) ->
fail:('a -> 'b -> 'c -> 'd -> 'e -> 'f -> [> ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f -> Stdlib.Uchar.t -> 'f
val encode : ('a -> 'b -> elt -> 'b) ->
fail:('a -> 'b -> [> ] -> 'b) -> 'a -> 'b -> Stdlib.Uchar.t -> 'b
type
t = Unicode.utf32_string
val compare : t -> t -> int
val equal : t -> t -> bool
val length : t -> int
val get : t -> int -> elt
val unsafe_get : t -> int -> elt
val set : t -> int -> elt -> unit
val unsafe_set : t -> int -> elt -> unit
val empty : t
val create : int -> t
val copy : t -> t
val cat : t -> t -> t
val sub : t -> int -> int -> t
val fill : t -> int -> int -> elt -> unit
val blit : t -> int -> t -> int -> int -> unit
val lead : t -> int -> int
val rear : t -> int -> int
val get_code : fail:(t ->
int -> int -> [> Unicode.utf32_decode_error ] -> Stdlib.Uchar.t) ->
t -> int Stdlib.ref -> Stdlib.Uchar.t
val set_code : fail:(t -> int -> [> ] -> Stdlib.Uchar.t) ->
t -> int Stdlib.ref -> Stdlib.Uchar.t -> unit
val of_utf8 : fail:(Unicode.utf8_string ->
int -> int -> [> Unicode.utf8_decode_error ] -> Stdlib.Uchar.t) ->
Unicode.utf8_string -> t
val of_utf16 : fail:(Unicode.utf16_string ->
int -> int -> [> Unicode.utf32_decode_error ] -> Stdlib.Uchar.t) ->
Unicode.utf16_string -> t
val of_array : elt array -> t