diff options
Diffstat (limited to 'stdlib/bytes.ml')
-rw-r--r-- | stdlib/bytes.ml | 1 |
1 files changed, 1 insertions, 0 deletions
diff --git a/stdlib/bytes.ml b/stdlib/bytes.ml index ce6e126db..4170ad02e 100644 --- a/stdlib/bytes.ml +++ b/stdlib/bytes.ml @@ -260,3 +260,4 @@ let rcontains_from s i c = type t = bytes let compare (x: t) (y: t) = Pervasives.compare x y +external equal : t -> t -> bool = "caml_string_equal" |