summaryrefslogtreecommitdiffstats
path: root/stdlib/printexc.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/printexc.ml')
-rw-r--r--stdlib/printexc.ml2
1 files changed, 2 insertions, 0 deletions
diff --git a/stdlib/printexc.ml b/stdlib/printexc.ml
index 842088be2..359bfbbdc 100644
--- a/stdlib/printexc.ml
+++ b/stdlib/printexc.ml
@@ -21,6 +21,8 @@ let prerr_loc file first_char last_char msg =
let print_exn = function
Out_of_memory ->
prerr_string "Out of memory\n"
+ | Stack_overflow ->
+ prerr_string "Stack overflow\n"
| Match_failure(file, first_char, last_char) ->
prerr_loc file first_char last_char "Pattern matching failed";
| Assert_failure(file, first_char, last_char) ->