summaryrefslogtreecommitdiffstats
path: root/stdlib/lazy.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/lazy.ml')
-rw-r--r--stdlib/lazy.ml2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/lazy.ml b/stdlib/lazy.ml
index 2faed9d3a..2af10859e 100644
--- a/stdlib/lazy.ml
+++ b/stdlib/lazy.ml
@@ -63,7 +63,7 @@ let force (l : 'arg t) =
result
with e ->
Obj.set_field x 0 (Obj.repr (fun () -> raise e));
- raise e;
+ raise e
end
;;