summaryrefslogtreecommitdiffstats
path: root/stdlib/buffer.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/buffer.mli')
-rw-r--r--stdlib/buffer.mli11
1 files changed, 7 insertions, 4 deletions
diff --git a/stdlib/buffer.mli b/stdlib/buffer.mli
index e7ce8b999..962f6bc7f 100644
--- a/stdlib/buffer.mli
+++ b/stdlib/buffer.mli
@@ -38,11 +38,12 @@ val create : int -> t
val contents : t -> string
(** Return a copy of the current contents of the buffer.
- The buffer itself is unchanged. *)
+ The buffer itself is unchanged. *)
val to_bytes : t -> bytes
(** Return a copy of the current contents of the buffer.
- The buffer itself is unchanged. *)
+ The buffer itself is unchanged.
+ @since 4.02 *)
val sub : t -> int -> int -> string
(** [Buffer.sub b off len] returns (a copy of) the bytes from the
@@ -85,7 +86,8 @@ val add_string : t -> string -> unit
(** [add_string b s] appends the string [s] at the end of the buffer [b]. *)
val add_bytes : t -> bytes -> unit
-(** [add_string b s] appends the string [s] at the end of the buffer [b]. *)
+(** [add_string b s] appends the string [s] at the end of the buffer [b].
+ @since 4.02 *)
val add_substring : t -> string -> int -> int -> unit
(** [add_substring b s ofs len] takes [len] characters from offset
@@ -93,7 +95,8 @@ val add_substring : t -> string -> int -> int -> unit
val add_subbytes : t -> bytes -> int -> int -> unit
(** [add_substring b s ofs len] takes [len] characters from offset
- [ofs] in byte sequence [s] and appends them at the end of the buffer [b]. *)
+ [ofs] in byte sequence [s] and appends them at the end of the buffer [b].
+ @since 4.02 *)
val add_substitute : t -> (string -> string) -> string -> unit
(** [add_substitute b f s] appends the string pattern [s] at the end