summaryrefslogtreecommitdiffstats
path: root/stdlib/stringLabels.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/stringLabels.mli')
-rw-r--r--stdlib/stringLabels.mli6
1 files changed, 6 insertions, 0 deletions
diff --git a/stdlib/stringLabels.mli b/stdlib/stringLabels.mli
index dcef6db03..1cf5d51ed 100644
--- a/stdlib/stringLabels.mli
+++ b/stdlib/stringLabels.mli
@@ -104,6 +104,12 @@ val map : f:(char -> char) -> string -> string
is returned.
@since 4.00.0 *)
+val mapi : f:(int -> char -> char) -> string -> string
+(** [String.mapi f s] calls [f] with each character of [s] and its
+ index (in increasing index order) and stores the results in a new
+ string that is returned.
+ @since 4.02.0 *)
+
val trim : string -> string
(** Return a copy of the argument, without leading and trailing
whitespace. The characters regarded as whitespace are: [' '],