@@ -129,11 +129,11 @@ let rec should_reresolve : Paths.Path.Resolved.t -> bool =
129
129
and should_resolve : Paths.Path.t -> bool =
130
130
fun p -> match p with `Resolved p -> should_reresolve p | _ -> true
131
131
132
- and should_resolve_constructor : Paths.Path.Constructor.t -> bool =
133
- fun p ->
134
- match p with
135
- | `Resolved p -> should_reresolve (p :> Paths.Path.Resolved.t )
136
- | _ -> true
132
+ (* and should_resolve_constructor : Paths.Path.Constructor.t -> bool = *)
133
+ (* fun p -> *)
134
+ (* match p with *)
135
+ (* | `Resolved p -> should_reresolve (p :> Paths.Path.Resolved.t) * )
136
+ (* | _ -> true *)
137
137
138
138
let type_path : Env.t -> Paths.Path.Type.t -> Paths.Path.Type.t =
139
139
fun env p ->
@@ -153,47 +153,42 @@ let type_path : Env.t -> Paths.Path.Type.t -> Paths.Path.Type.t =
153
153
Errors. report ~what: (`Type_path cp) ~tools_error: e `Lookup ;
154
154
p)
155
155
156
- let value_path : Env.t -> Paths.Path.Value.t -> Paths.Path.Value.t =
157
- fun env p ->
158
- if not (should_resolve (p :> Paths.Path.t )) then p
159
- else
160
- let cp = Component.Of_Lang. (value_path (empty () ) p) in
161
- match cp with
162
- | `Resolved p ->
163
- let result = Tools. reresolve_value env p in
164
- `Resolved Lang_of. (Path. resolved_value (empty () ) result)
165
- | _ -> (
166
- match Tools. resolve_value_path env cp with
167
- | Ok p' ->
168
- let result = Tools. reresolve_value env p' in
169
- `Resolved Lang_of. (Path. resolved_value (empty () ) result)
170
- | Error e ->
171
- Errors. report ~what: (`Value_path cp) ~tools_error: e `Lookup ;
172
- p)
173
-
174
- let constructor_path :
175
- Env. t -> Paths.Path.Constructor. t -> Paths.Path.Constructor. t =
176
- fun env p ->
177
- if not (should_resolve_constructor p) then p
178
- else
179
- let cp = Component.Of_Lang. (constructor_path (empty () ) p) in
180
- match cp with
181
- | `Resolved p ->
182
- let result = Tools. reresolve_constructor env p in
183
- `Resolved Lang_of. (Path. resolved_constructor (empty () ) result)
184
- | _ -> (
185
- match Tools. resolve_constructor_path env cp with
186
- | Ok p' ->
187
- let result = Tools. reresolve_constructor env p' in
188
- `Resolved Lang_of. (Path. resolved_constructor (empty () ) result)
189
- | Error e ->
190
- Errors. report ~what: (`Constructor_path cp) ~tools_error: e `Lookup ;
191
- p)
192
-
193
- let () =
194
- (* Until those are used *)
195
- ignore value_path;
196
- ignore constructor_path
156
+ (* let value_path : Env.t -> Paths.Path.Value.t -> Paths.Path.Value.t = *)
157
+ (* fun env p -> *)
158
+ (* if not (should_resolve (p :> Paths.Path.t)) then p *)
159
+ (* else *)
160
+ (* let cp = Component.Of_Lang.(value_path (empty ()) p) in *)
161
+ (* match cp with *)
162
+ (* | `Resolved p -> *)
163
+ (* let result = Tools.reresolve_value env p in *)
164
+ (* `Resolved Lang_of.(Path.resolved_value (empty ()) result) *)
165
+ (* | _ -> ( *)
166
+ (* match Tools.resolve_value_path env cp with *)
167
+ (* | Ok p' -> *)
168
+ (* let result = Tools.reresolve_value env p' in *)
169
+ (* `Resolved Lang_of.(Path.resolved_value (empty ()) result) *)
170
+ (* | Error e -> *)
171
+ (* Errors.report ~what:(`Value_path cp) ~tools_error:e `Lookup; *)
172
+ (* p) *)
173
+
174
+ (* let constructor_path : *)
175
+ (* Env.t -> Paths.Path.Constructor.t -> Paths.Path.Constructor.t = *)
176
+ (* fun env p -> *)
177
+ (* if not (should_resolve_constructor p) then p *)
178
+ (* else *)
179
+ (* let cp = Component.Of_Lang.(constructor_path (empty ()) p) in *)
180
+ (* match cp with *)
181
+ (* | `Resolved p -> *)
182
+ (* let result = Tools.reresolve_constructor env p in *)
183
+ (* `Resolved Lang_of.(Path.resolved_constructor (empty ()) result) *)
184
+ (* | _ -> ( *)
185
+ (* match Tools.resolve_constructor_path env cp with *)
186
+ (* | Ok p' -> *)
187
+ (* let result = Tools.reresolve_constructor env p' in *)
188
+ (* `Resolved Lang_of.(Path.resolved_constructor (empty ()) result) *)
189
+ (* | Error e -> *)
190
+ (* Errors.report ~what:(`Constructor_path cp) ~tools_error:e `Lookup; *)
191
+ (* p) *)
197
192
198
193
let class_type_path : Env. t -> Paths.Path.ClassType. t -> Paths.Path.ClassType. t
199
194
=
0 commit comments