Module Unicode

module Unicode: sig .. end

module Uint32: sig .. end
type utf8_char = char 
type utf8_string = string 
type utf16_char = int 
type utf16_string = (int, Stdlib.Bigarray.int16_unsigned_elt, Stdlib.Bigarray.c_layout)
Stdlib.Bigarray.Array1.t
type utf32_char = Uint32.t 
type utf32_string = (int32, Stdlib.Bigarray.int32_elt, Stdlib.Bigarray.c_layout)
Stdlib.Bigarray.Array1.t
type utf8_decode_error = [ `illegal_sequence
| `over_17planes of int
| `overly_long of
[ `over_17planes of int
| `some of Stdlib.Uchar.t
| `surrogate_fragment of int ]
| `surrogate_fragment of int
| `truncated ]
val utf8_sequence : fail:([> `illegal_sequence ] -> int) -> utf8_char -> int
val utf8_is_trailing : utf8_char -> bool
val utf8_decode3 : ('d -> 'e -> utf8_char) ->
('d -> 'e -> 'e) ->
('d -> 'e -> bool) ->
('a -> 'b -> 'c -> 'd -> 'e -> 'e -> Stdlib.Uchar.t -> 'f) ->
fail:('a ->
'b -> 'c -> 'd -> 'e -> 'e -> [> utf8_decode_error ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f
val utf8_decode : ('a -> 'b -> utf8_char) ->
('a -> 'b -> 'b) ->
('a -> 'b -> bool) ->
('a -> 'b -> 'b -> Stdlib.Uchar.t -> 'c) ->
fail:('a -> 'b -> 'b -> [> utf8_decode_error ] -> 'c) ->
'a -> 'b -> 'c
val utf8_encode4 : ('e -> 'f -> utf8_char -> 'f) ->
fail:('a -> 'b -> 'c -> 'd -> 'e -> 'f -> [> `unexist ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f -> Stdlib.Uchar.t -> 'f
val utf8_encode : ('a -> 'b -> utf8_char -> 'b) ->
fail:('a -> 'b -> [> `unexist ] -> 'b) -> 'a -> 'b -> Stdlib.Uchar.t -> 'b
val utf8_lead : utf8_string -> int -> int
val utf8_rear : utf8_string -> int -> int
val utf8_get_code : fail:(utf8_string ->
int -> int -> [> utf8_decode_error ] -> Stdlib.Uchar.t) ->
utf8_string -> int Stdlib.ref -> Stdlib.Uchar.t
val utf8_set_code : fail:(bytes -> int -> [> `unexist ] -> Stdlib.Uchar.t) ->
bytes -> int Stdlib.ref -> Stdlib.Uchar.t -> unit
type utf16_decode_error = [ `surrogate_fragment of int ] 
val utf16_sequence : fail:([> `surrogate_fragment of int ] -> int) -> utf16_char -> int
val utf16_is_trailing : utf16_char -> bool
val utf16_decode3 : ('d -> 'e -> utf16_char) ->
('d -> 'e -> 'e) ->
('d -> 'e -> bool) ->
('a -> 'b -> 'c -> 'd -> 'e -> 'e -> Stdlib.Uchar.t -> 'f) ->
fail:('a ->
'b -> 'c -> 'd -> 'e -> 'e -> [> utf16_decode_error ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f
val utf16_decode : ('a -> 'b -> utf16_char) ->
('a -> 'b -> 'b) ->
('a -> 'b -> bool) ->
('a -> 'b -> 'b -> Stdlib.Uchar.t -> 'c) ->
fail:('a -> 'b -> 'b -> [> utf16_decode_error ] -> 'c) ->
'a -> 'b -> 'c
val utf16_encode4 : ('e -> 'f -> utf16_char -> 'f) ->
fail:('a -> 'b -> 'c -> 'd -> 'e -> 'f -> [> `unexist ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f -> Stdlib.Uchar.t -> 'f
val utf16_encode : ('a -> 'b -> utf16_char -> 'b) ->
fail:('a -> 'b -> [> `unexist ] -> 'b) -> 'a -> 'b -> Stdlib.Uchar.t -> 'b
val utf16_lead : utf16_string -> int -> int
val utf16_rear : utf16_string -> int -> int
val utf16_get_code : fail:(utf16_string ->
int -> int -> [> utf16_decode_error ] -> Stdlib.Uchar.t) ->
utf16_string -> int Stdlib.ref -> Stdlib.Uchar.t
val utf16_set_code : fail:(utf16_string -> int -> [> `unexist ] -> Stdlib.Uchar.t) ->
utf16_string -> int Stdlib.ref -> Stdlib.Uchar.t -> unit
type utf32_decode_error = [ `illegal_sequence | `over_17planes of int | `surrogate_fragment of int ] 
val utf32_sequence : fail:([> `illegal_sequence | `surrogate_fragment of int ] -> int) ->
utf32_char -> int
val utf32_is_trailing : utf32_char -> bool
val utf32_decode3 : ('d -> 'e -> utf32_char) ->
('d -> 'e -> 'e) ->
('d -> 'e -> bool) ->
('a -> 'b -> 'c -> 'd -> 'e -> 'e -> Stdlib.Uchar.t -> 'f) ->
fail:('a ->
'b -> 'c -> 'd -> 'e -> 'e -> [> utf32_decode_error ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f
val utf32_decode : ('a -> 'b -> utf32_char) ->
('a -> 'b -> 'b) ->
('a -> 'b -> bool) ->
('a -> 'b -> 'b -> Stdlib.Uchar.t -> 'c) ->
fail:('a -> 'b -> 'b -> [> utf32_decode_error ] -> 'c) ->
'a -> 'b -> 'c
val utf32_encode4 : ('e -> 'f -> utf32_char -> 'f) ->
fail:('a -> 'b -> 'c -> 'd -> 'e -> 'f -> [> ] -> 'f) ->
'a -> 'b -> 'c -> 'd -> 'e -> 'f -> Stdlib.Uchar.t -> 'f
val utf32_encode : ('a -> 'b -> utf32_char -> 'b) ->
fail:('a -> 'b -> [> ] -> 'b) -> 'a -> 'b -> Stdlib.Uchar.t -> 'b
val utf32_lead : utf32_string -> int -> int
val utf32_rear : utf32_string -> int -> int
val utf32_get_code : fail:(utf32_string ->
int -> int -> [> utf32_decode_error ] -> Stdlib.Uchar.t) ->
utf32_string -> int Stdlib.ref -> Stdlib.Uchar.t
val utf32_set_code : fail:(utf32_string -> int -> [>  ] -> Stdlib.Uchar.t) ->
utf32_string -> int Stdlib.ref -> Stdlib.Uchar.t -> unit
val utf8_of_utf16 : fail:(utf16_string ->
int ->
int -> [> `surrogate_fragment of int | `unexist ] -> Stdlib.Uchar.t) ->
utf16_string -> utf8_string
val utf8_of_utf32 : fail:(utf32_string ->
int ->
int ->
[> `illegal_sequence
| `over_17planes of int
| `surrogate_fragment of int
| `unexist ] ->
Stdlib.Uchar.t) ->
utf32_string -> utf8_string
val utf16_of_utf8 : fail:(utf8_string ->
int ->
int ->
[> `illegal_sequence
| `over_17planes of int
| `overly_long of
[ `over_17planes of int
| `some of Stdlib.Uchar.t
| `surrogate_fragment of int ]
| `surrogate_fragment of int
| `truncated
| `unexist ] ->
Stdlib.Uchar.t) ->
utf8_string -> utf16_string
val utf16_of_utf32 : fail:(utf32_string ->
int ->
int ->
[> `illegal_sequence
| `over_17planes of int
| `surrogate_fragment of int
| `unexist ] ->
Stdlib.Uchar.t) ->
utf32_string -> utf16_string
val utf32_of_utf8 : fail:(utf8_string ->
int -> int -> [> utf8_decode_error ] -> Stdlib.Uchar.t) ->
utf8_string -> utf32_string
val utf32_of_utf16 : fail:(utf16_string ->
int -> int -> [> utf16_decode_error ] -> Stdlib.Uchar.t) ->
utf16_string -> utf32_string
module UTF8: sig .. end
module UTF8_Bytes: sig .. end
module UTF16: sig .. end
module UTF32: sig .. end