diff options
Diffstat (limited to 'stdlib/char.ml')
-rw-r--r-- | stdlib/char.ml | 1 |
1 files changed, 1 insertions, 0 deletions
diff --git a/stdlib/char.ml b/stdlib/char.ml index 15c463542..1ba5bf6ff 100644 --- a/stdlib/char.ml +++ b/stdlib/char.ml @@ -65,3 +65,4 @@ let uppercase c = type t = char let compare c1 c2 = code c1 - code c2 +let equal (c1: t) (c2: t) = compare c1 c2 = 0 |