Skip to content

Commit f5bf4bd

Browse files
author
Jacques Garrigue
committed
Fix PR#6993: allow recursive types when doing unification on GADT indices
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@16426 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
1 parent affb539 commit f5bf4bd

File tree

4 files changed

+31
-2
lines changed

4 files changed

+31
-2
lines changed

Changes

+1
Original file line numberDiff line numberDiff line change
@@ -178,6 +178,7 @@ Bug fixes:
178178
- PR#6982: unexpected type error when packing a module alias
179179
- PR#6985: `module type of struct include Bar end exposes
180180
%s#row when Bar contains private row types
181+
- PR#6993: Segfault from recursive modules violating exhaustiveness assumptions
181182
- GPR#205: Clear caml_backtrace_last_exn before registering as root (report
182183
and fix by Frederic Bour)
183184
- GPR#220: minor -dsource error on recursive modules
+12
Original file line numberDiff line numberDiff line change
@@ -0,0 +1,12 @@
1+
type (_, _) eqp = Y : ('a, 'a) eqp | N : string -> ('a, 'b) eqp
2+
let f : ('a list, 'a) eqp -> unit = function N s -> print_string s;;
3+
4+
module rec A : sig type t = B.t list end =
5+
struct type t = B.t list end
6+
and B : sig type t val eq : (B.t list, t) eqp end =
7+
struct
8+
type t = A.t
9+
let eq = Y
10+
end;;
11+
12+
f B.eq;;
Original file line numberDiff line numberDiff line change
@@ -0,0 +1,13 @@
1+
2+
# Characters 100-130:
3+
let f : ('a list, 'a) eqp -> unit = function N s -> print_string s;;
4+
^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
5+
Warning 8: this pattern-matching is not exhaustive.
6+
Here is an example of a value that is not matched:
7+
Y
8+
type (_, _) eqp = Y : ('a, 'a) eqp | N : string -> ('a, 'b) eqp
9+
val f : ('a list, 'a) eqp -> unit = <fun>
10+
# module rec A : sig type t = B.t list end
11+
and B : sig type t val eq : (B.t list, t) eqp end
12+
# Exception: Match_failure ("//toplevel//", 2, 36).
13+
#

typing/ctype.ml

+5-2
Original file line numberDiff line numberDiff line change
@@ -1652,9 +1652,12 @@ let correct_abbrev env path params ty =
16521652

16531653
exception Occur
16541654

1655+
let allow_recursive env ty =
1656+
(!Clflags.recursive_types || !umode = Pattern) && is_contractive env ty
1657+
16551658
let rec occur_rec env visited ty0 ty =
16561659
if ty == ty0 then raise Occur;
1657-
let occur_ok = !Clflags.recursive_types && is_contractive env ty in
1660+
let occur_ok = allow_recursive env ty in
16581661
match ty.desc with
16591662
Tconstr(p, tl, abbrev) ->
16601663
begin try
@@ -1669,7 +1672,7 @@ let rec occur_rec env visited ty0 ty =
16691672
match ty'.desc with
16701673
Tobject _ | Tvariant _ -> ()
16711674
| _ ->
1672-
if not (!Clflags.recursive_types && is_contractive env ty') then
1675+
if not (allow_recursive env ty') then
16731676
iter_type_expr (occur_rec env (ty'::visited) ty0) ty'
16741677
with Cannot_expand ->
16751678
if not occur_ok then raise Occur

0 commit comments

Comments
 (0)