summaryrefslogtreecommitdiffstats
path: root/stdlib/printexc.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/printexc.ml')
-rw-r--r--stdlib/printexc.ml3
1 files changed, 2 insertions, 1 deletions
diff --git a/stdlib/printexc.ml b/stdlib/printexc.ml
index 428396247..be1d8f0f8 100644
--- a/stdlib/printexc.ml
+++ b/stdlib/printexc.ml
@@ -58,7 +58,8 @@ let to_string x =
sprintf locfmt file line char (char+6) "Undefined recursive module"
| _ ->
let x = Obj.repr x in
- let constructor = (Obj.magic(Obj.field (Obj.field x 0) 0) : string) in
+ let constructor =
+ (Obj.magic (Obj.field (Obj.field x 0) 0) : string) in
constructor ^ (fields x) in
conv !printers