summaryrefslogtreecommitdiffstats
path: root/stdlib/bytesLabels.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/bytesLabels.mli')
-rw-r--r--stdlib/bytesLabels.mli5
1 files changed, 5 insertions, 0 deletions
diff --git a/stdlib/bytesLabels.mli b/stdlib/bytesLabels.mli
index 23ccaf391..b92e76d09 100644
--- a/stdlib/bytesLabels.mli
+++ b/stdlib/bytesLabels.mli
@@ -112,6 +112,11 @@ val map : f:(char -> char) -> bytes -> bytes
stores the resulting bytes in a new sequence that is returned as
the result. *)
+val mapi : (int -> char -> char) -> bytes -> bytes
+(** [mapi f s] calls [f] with each character of [s] and its
+ index (in increasing index order) and stores the resulting bytes
+ in a new sequence that is returned as the result. *)
+
val trim : bytes -> bytes
(** Return a copy of the argument, without leading and trailing
whitespace. The bytes regarded as whitespace are the ASCII