summaryrefslogtreecommitdiffstats
path: root/stdlib/pervasives.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/pervasives.ml')
-rw-r--r--stdlib/pervasives.ml2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/pervasives.ml b/stdlib/pervasives.ml
index 1ae6765a2..1904da847 100644
--- a/stdlib/pervasives.ml
+++ b/stdlib/pervasives.ml
@@ -21,7 +21,7 @@ let failwith s = raise(Failure s)
let invalid_arg s = raise(Invalid_argument s)
exception Exit
-exception Assert_failure of string * int * int
+exception Assert_failure of (string * int * int)
(* Comparisons *)