summaryrefslogtreecommitdiffstats
path: root/stdlib/callback.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/callback.ml')
-rw-r--r--stdlib/callback.ml2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/callback.ml b/stdlib/callback.ml
index c9cf062bf..6e4f9481e 100644
--- a/stdlib/callback.ml
+++ b/stdlib/callback.ml
@@ -21,5 +21,5 @@ let register name v =
let register_exception name (exn : exn) =
let exn = Obj.repr exn in
- let slot = if Obj.size exn = 1 then exn else Obj.field exn 1 in
+ let slot = if Obj.tag exn = Obj.object_tag then exn else Obj.field exn 0 in
register_named_value name slot