File tree Expand file tree Collapse file tree 5 files changed +19
-4
lines changed Expand file tree Collapse file tree 5 files changed +19
-4
lines changed Original file line number Diff line number Diff line change @@ -27,7 +27,6 @@ module Tools_error = struct
27
27
[ `Local of
28
28
Env. t * Ident. path_module
29
29
(* Internal error: Found local path during lookup *)
30
- | `Unresolved_apply (* [`Apply] argument is not [`Resolved] *)
31
30
| `Find_failure
32
31
| (* Internal error: the module was not found in the parent signature *)
33
32
`Lookup_failure of
@@ -136,7 +135,6 @@ module Tools_error = struct
136
135
| `LocalMT (_ , id ) -> Format. fprintf fmt " Local id found: %a" Ident. fmt id
137
136
| `Local (_ , id ) -> Format. fprintf fmt " Local id found: %a" Ident. fmt id
138
137
| `LocalType (_ , id ) -> Format. fprintf fmt " Local id found: %a" Ident. fmt id
139
- | `Unresolved_apply -> Format. fprintf fmt " Unresolved apply"
140
138
| `Find_failure -> Format. fprintf fmt " Find failure"
141
139
| `Lookup_failure m ->
142
140
Format. fprintf fmt " Lookup failure (module): %a"
@@ -189,7 +187,6 @@ let is_unexpanded_module_type_of =
189
187
| `Local _ -> false
190
188
| `Find_failure -> false
191
189
| `Lookup_failure _ -> false
192
- | `Unresolved_apply -> false
193
190
| `Lookup_failure_root _ -> false
194
191
| `Parent p -> inner (p :> any )
195
192
| `Parent_sig p -> inner (p :> any )
Original file line number Diff line number Diff line change @@ -951,7 +951,8 @@ and resolve_module :
951
951
match handle_apply ~mark_substituted env func_path' arg_path' m with
952
952
| Ok (p , m ) -> Ok (p, Component.Delayed. put_val m)
953
953
| Error e -> Error (`Parent (`Parent_expr e)))
954
- | _ -> Error `Unresolved_apply )
954
+ | Error e , _ -> Error e
955
+ | _ , Error e -> Error e)
955
956
| `Identifier (i , hidden ) ->
956
957
of_option ~error: (`Lookup_failure i) (Env. (lookup_by_id s_module) i env)
957
958
>> = fun (`Module (_ , m )) ->
Original file line number Diff line number Diff line change 19
19
(enabled_if
20
20
(>= %{ocaml_version} 4.06.0)))
21
21
22
+ ; 4.07.0 and above
23
+
24
+ (cram
25
+ (applies_to github_issue_944)
26
+ (enabled_if
27
+ (>= %{ocaml_version} 4.07.0)))
28
+
22
29
; 4.08.0 and above
23
30
24
31
(cram
Original file line number Diff line number Diff line change
1
+ val f : Set .Make (String ).t -> unit
Original file line number Diff line number Diff line change
1
+ A quick test to repro the issue found in # 944
2
+
3
+ $ ocamlc -bin-annot -c foo. mli
4
+
5
+ $ odoc compile foo. cmti
6
+ $ odoc link foo. odoc -- enable-missing-root-warning
7
+ File " foo.odoc" :
8
+ Warning: Couldn't find the following modules:
9
+ Stdlib
You can’t perform that action at this time.
0 commit comments