summaryrefslogtreecommitdiffstats
path: root/stdlib/stringLabels.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/stringLabels.mli')
-rw-r--r--stdlib/stringLabels.mli2
1 files changed, 2 insertions, 0 deletions
diff --git a/stdlib/stringLabels.mli b/stdlib/stringLabels.mli
index f9be415cc..59b0eb7c2 100644
--- a/stdlib/stringLabels.mli
+++ b/stdlib/stringLabels.mli
@@ -175,6 +175,8 @@ val compare: t -> t -> int
(**/**)
+(* The following is for system use only. Do not call directly. *)
+
external unsafe_get : string -> int -> char = "%string_unsafe_get"
external unsafe_set : string -> int -> char -> unit = "%string_unsafe_set"
external unsafe_blit :