summaryrefslogtreecommitdiffstats
path: root/stdlib/string.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/string.mli')
-rw-r--r--stdlib/string.mli9
1 files changed, 9 insertions, 0 deletions
diff --git a/stdlib/string.mli b/stdlib/string.mli
index d12b52180..627c8ad62 100644
--- a/stdlib/string.mli
+++ b/stdlib/string.mli
@@ -70,6 +70,15 @@ val escaped: string -> string
by escape sequences, following the lexical conventions of
Objective Caml. *)
+val index: string -> char -> int
+ (* [index s c] returns the position of the leftmost occurrence of
+ character [c] in string [s]. Raise [Not_found] if [c] does not
+ occur in [s]. *)
+val rindex: string -> char -> int
+ (* [rindex s c] returns the position of the rightmost occurrence of
+ character [c] in string [s]. Raise [Not_found] if [c] does not
+ occur in [s]. *)
+
val uppercase: string -> string
(* Return a copy of the argument, with all lowercase letters
translated to uppercase, including accented letters of the ISO