@@ -72,17 +72,6 @@ module Tools_error = struct
7272 (* Could not find the module in the environment *)
7373 | `Parent of parent_lookup_error ]
7474
75- and simple_datatype_lookup_error =
76- [ `LocalDataType of
77- Env. t * Ident. path_datatype
78- (* Internal error: Found local path during lookup *)
79- | `Find_failure
80- (* Internal error: the type was not found in the parent signature *)
81- | `Lookup_failureT of
82- Identifier.Path.Type. t
83- (* Could not find the module in the environment *)
84- | `Parent of parent_lookup_error ]
85-
8675 and simple_value_lookup_error =
8776 [ `LocalValue of
8877 Env. t * Ident. path_value
@@ -94,17 +83,6 @@ module Tools_error = struct
9483 (* Could not find the module in the environment *)
9584 | `Parent of parent_lookup_error ]
9685
97- and simple_constructor_lookup_error =
98- [ `LocalConstructor of
99- Env. t * Ident. constructor
100- (* Internal error: Found local path during lookup *)
101- | `Find_failure
102- (* Internal error: the type was not found in the parent signature *)
103- | `Lookup_failureC of
104- Identifier.Path.Constructor. t
105- (* Could not find the module in the environment *)
106- | `ParentC of simple_datatype_lookup_error ]
107-
10886 and parent_lookup_error =
10987 [ `Parent_sig of
11088 expansion_of_module_error
@@ -132,8 +110,6 @@ module Tools_error = struct
132110 type any =
133111 [ simple_type_lookup_error
134112 | simple_value_lookup_error
135- | simple_constructor_lookup_error
136- | simple_datatype_lookup_error
137113 | simple_module_type_lookup_error
138114 | simple_module_type_expr_of_module_error
139115 | simple_module_lookup_error
@@ -171,10 +147,6 @@ module Tools_error = struct
171147 | `LocalMT (_ , id ) -> Format. fprintf fmt " Local id found: %a" Ident. fmt id
172148 | `Local (_ , id ) -> Format. fprintf fmt " Local id found: %a" Ident. fmt id
173149 | `LocalType (_ , id ) -> Format. fprintf fmt " Local id found: %a" Ident. fmt id
174- | `LocalDataType (_ , id ) ->
175- Format. fprintf fmt " Local id found: %a" Ident. fmt id
176- | `LocalConstructor (_ , id ) ->
177- Format. fprintf fmt " Local id found: %a" Ident. fmt id
178150 | `LocalValue (_ , id ) ->
179151 Format. fprintf fmt " Local id found: %a" Ident. fmt id
180152 | `Find_failure -> Format. fprintf fmt " Find failure"
@@ -196,14 +168,9 @@ module Tools_error = struct
196168 Format. fprintf fmt " Lookup failure (value): %a"
197169 Component.Fmt. model_identifier
198170 (m :> Odoc_model.Paths.Identifier.t )
199- | `Lookup_failureC m ->
200- Format. fprintf fmt " Lookup failure (constructor): %a"
201- Component.Fmt. model_identifier
202- (m :> Odoc_model.Paths.Identifier.t )
203171 | `ApplyNotFunctor -> Format. fprintf fmt " Apply module is not a functor"
204172 | `Class_replaced -> Format. fprintf fmt " Class replaced"
205173 | `Parent p -> pp fmt (p :> any )
206- | `ParentC p -> pp fmt (p :> any )
207174 | `UnexpandedTypeOf t ->
208175 Format. fprintf fmt " Unexpanded `module type of` expression: %a"
209176 Component.Fmt. module_type_type_of_desc t
@@ -239,9 +206,7 @@ let is_unexpanded_module_type_of =
239206 | `Find_failure -> false
240207 | `Lookup_failure _ -> false
241208 | `Lookup_failure_root _ -> false
242- | `Lookup_failureC _ -> false
243209 | `Parent p -> inner (p :> any )
244- | `ParentC p -> inner (p :> any )
245210 | `Parent_sig p -> inner (p :> any )
246211 | `Parent_module_type p -> inner (p :> any )
247212 | `Parent_expr p -> inner (p :> any )
@@ -259,8 +224,6 @@ let is_unexpanded_module_type_of =
259224 | `Lookup_failureT _ -> false
260225 | `Lookup_failureV _ -> false
261226 | `LocalType _ -> false
262- | `LocalDataType _ -> false
263- | `LocalConstructor _ -> false
264227 | `LocalValue _ -> false
265228 | `Class_replaced -> false
266229 | `OpaqueClass -> false
@@ -335,7 +298,6 @@ type what =
335298 | `Module of Identifier.Module .t
336299 | `Module_type of Identifier.Signature .t
337300 | `Module_path of Cpath .module_
338- | `Constructor_path of Cpath .constructor
339301 | `Module_type_path of Cpath .module_type
340302 | `Module_type_U of Component.ModuleType .U .expr
341303 | `Include of Component.Include .decl
@@ -388,7 +350,6 @@ let report ~(what : what) ?tools_error action =
388350 | `Type cfrag -> r " type" type_fragment cfrag
389351 | `Type_path path -> r " type" type_path path
390352 | `Value_path path -> r " value" value_path path
391- | `Constructor_path path -> r " constructor" constructor_path path
392353 | `Class_type_path path -> r " class_type" class_type_path path
393354 | `With_module frag -> r " module substitution" module_fragment frag
394355 | `With_module_type frag ->
0 commit comments