summaryrefslogtreecommitdiffstats
path: root/stdlib/printexc.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/printexc.ml')
-rw-r--r--stdlib/printexc.ml8
1 files changed, 4 insertions, 4 deletions
diff --git a/stdlib/printexc.ml b/stdlib/printexc.ml
index 0d48761f1..a72406922 100644
--- a/stdlib/printexc.ml
+++ b/stdlib/printexc.ml
@@ -47,12 +47,12 @@ let fields x =
;;
let to_string = function
- | Out_of_memory -> "Out of memory";
- | Stack_overflow -> "Stack overflow";
+ | Out_of_memory -> "Out of memory"
+ | Stack_overflow -> "Stack overflow"
| Match_failure(file, line, char) ->
- sprintf locfmt file line char (char+5) "Pattern matching failed";
+ sprintf locfmt file line char (char+5) "Pattern matching failed"
| Assert_failure(file, line, char) ->
- sprintf locfmt file line char (char+6) "Assertion failed";
+ sprintf locfmt file line char (char+6) "Assertion failed"
| x ->
let x = Obj.repr x in
let constructor = (Obj.magic(Obj.field (Obj.field x 0) 0) : string) in