@@ -21,26 +21,26 @@ let type_path : Env.t -> Paths.Path.Type.t -> Paths.Path.Type.t =
2121 | Ok p' -> `Resolved Lang_of. (Path. resolved_type (empty () ) p')
2222 | Error _ -> p)
2323
24- and value_path : Env.t -> Paths.Path.Value.t -> Paths.Path.Value.t =
25- fun env p ->
26- match p with
27- | `Resolved _ -> p
28- | _ -> (
29- let cp = Component.Of_Lang. (value_path (empty () ) p) in
30- match Tools. resolve_value_path env cp with
31- | Ok p' -> `Resolved Lang_of. (Path. resolved_value (empty () ) p')
32- | Error _ -> p)
33-
34- and constructor_path :
35- Env. t -> Paths.Path.Constructor. t -> Paths.Path.Constructor. t =
36- fun env p ->
37- match p with
38- | `Resolved _ -> p
39- | _ -> (
40- let cp = Component.Of_Lang. (constructor_path (empty () ) p) in
41- match Tools. resolve_constructor_path env cp with
42- | Ok p' -> `Resolved Lang_of. (Path. resolved_constructor (empty () ) p')
43- | Error _ -> p)
24+ (* and value_path : Env.t -> Paths.Path.Value.t -> Paths.Path.Value.t = *)
25+ (* fun env p -> *)
26+ (* match p with *)
27+ (* | `Resolved _ -> p *)
28+ (* | _ -> ( *)
29+ (* let cp = Component.Of_Lang.(value_path (empty ()) p) in *)
30+ (* match Tools.resolve_value_path env cp with *)
31+ (* | Ok p' -> `Resolved Lang_of.(Path.resolved_value (empty ()) p') * )
32+ (* | Error _ -> p) * )
33+
34+ (* and constructor_path : *)
35+ (* Env.t -> Paths.Path.Constructor.t -> Paths.Path.Constructor.t = *)
36+ (* fun env p -> *)
37+ (* match p with *)
38+ (* | `Resolved _ -> p *)
39+ (* | _ -> ( *)
40+ (* let cp = Component.Of_Lang.(constructor_path (empty ()) p) in *)
41+ (* match Tools.resolve_constructor_path env cp with *)
42+ (* | Ok p' -> `Resolved Lang_of.(Path.resolved_constructor (empty ()) p') * )
43+ (* | Error _ -> p) * )
4444
4545and module_type_path :
4646 Env. t -> Paths.Path.ModuleType. t -> Paths.Path.ModuleType. t =
@@ -74,11 +74,6 @@ and class_type_path : Env.t -> Paths.Path.ClassType.t -> Paths.Path.ClassType.t
7474 | Ok p' -> `Resolved Lang_of. (Path. resolved_class_type (empty () ) p')
7575 | Error _ -> p)
7676
77- let () =
78- (* Until those are used *)
79- ignore value_path;
80- ignore constructor_path
81-
8277let rec unit env t =
8378 let open Compilation_unit in
8479 let source_info =
0 commit comments