summaryrefslogtreecommitdiffstats
path: root/stdlib/char.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/char.mli')
-rw-r--r--stdlib/char.mli12
1 files changed, 11 insertions, 1 deletions
diff --git a/stdlib/char.mli b/stdlib/char.mli
index 7afa37bb4..6d7b53565 100644
--- a/stdlib/char.mli
+++ b/stdlib/char.mli
@@ -1,6 +1,16 @@
-(* Character operations *)
+(* Module [Char]: character operations *)
external code: char -> int = "%identity"
+ (* Return the ASCII code of the argument. *)
val chr: int -> char
+ (* Return the character with the given ASCII code.
+ Raise [Invalid_argument "char_of_int"] if the argument is
+ outside the range 0--255. *)
val escaped : char -> string
+ (* Return a string representing the given character,
+ with special characters escaped following the lexical conventions
+ of Caml Light. *)
+
+(*--*)
+
external unsafe_chr: int -> char = "%identity"