File tree Expand file tree Collapse file tree 2 files changed +4
-7
lines changed Expand file tree Collapse file tree 2 files changed +4
-7
lines changed Original file line number Diff line number Diff line change @@ -53,18 +53,12 @@ module Env = struct
53
53
match item.str_desc with
54
54
| Tstr_module mb -> module_binding env parent mb
55
55
| Tstr_recmodule mbs -> module_bindings env parent mbs
56
- | Tstr_modtype mtd -> module_type_decl env parent mtd
56
+ | Tstr_modtype mtd -> module_type_declaration env parent mtd
57
57
| Tstr_open _ | Tstr_value _ | Tstr_class _ | Tstr_eval _
58
58
| Tstr_class_type _ | Tstr_include _ | Tstr_attribute _ | Tstr_primitive _
59
59
| Tstr_type _ | Tstr_typext _ | Tstr_exception _ ->
60
60
()
61
61
62
- and module_type_decl env _parent mtd =
63
- let id = Ident_env. find_module_type env mtd.mtd_id in
64
- match mtd.mtd_type with
65
- | None -> ()
66
- | Some mty -> module_type env (id :> Identifier.Signature.t ) mty
67
-
68
62
and module_type env (parent : Identifier.Signature.t ) mty =
69
63
match mty.mty_desc with
70
64
| Tmty_signature sg -> signature env (parent : Identifier.Signature.t ) sg
Original file line number Diff line number Diff line change @@ -56,6 +56,9 @@ module Analysis = struct
56
56
()
57
57
| _ -> ()
58
58
59
+ (* Add module_binding equivalent of pat *)
60
+
61
+
59
62
let module_expr poses mod_expr =
60
63
match mod_expr with
61
64
| { Typedtree. mod_desc = Tmod_ident (p, _); mod_loc; _ }
You can’t perform that action at this time.
0 commit comments