Skip to content

Commit e4ceb80

Browse files
panglesdjonludlam
authored andcommitted
remove duplicated function
Signed-off-by: Paul-Elliot <[email protected]>
1 parent 0ef494b commit e4ceb80

File tree

2 files changed

+4
-7
lines changed

2 files changed

+4
-7
lines changed

src/loader/implementation.ml

Lines changed: 1 addition & 7 deletions
Original file line numberDiff line numberDiff line change
@@ -53,18 +53,12 @@ module Env = struct
5353
match item.str_desc with
5454
| Tstr_module mb -> module_binding env parent mb
5555
| 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
5757
| Tstr_open _ | Tstr_value _ | Tstr_class _ | Tstr_eval _
5858
| Tstr_class_type _ | Tstr_include _ | Tstr_attribute _ | Tstr_primitive _
5959
| Tstr_type _ | Tstr_typext _ | Tstr_exception _ ->
6060
()
6161

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-
6862
and module_type env (parent : Identifier.Signature.t) mty =
6963
match mty.mty_desc with
7064
| Tmty_signature sg -> signature env (parent : Identifier.Signature.t) sg

src/loader/typedtree_traverse.ml

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -56,6 +56,9 @@ module Analysis = struct
5656
()
5757
| _ -> ()
5858

59+
(* Add module_binding equivalent of pat *)
60+
61+
5962
let module_expr poses mod_expr =
6063
match mod_expr with
6164
| { Typedtree.mod_desc = Tmod_ident (p, _); mod_loc; _ }

0 commit comments

Comments
 (0)