File tree Expand file tree Collapse file tree 9 files changed +12
-11
lines changed
Expand file tree Collapse file tree 9 files changed +12
-11
lines changed Original file line number Diff line number Diff line change @@ -2,7 +2,7 @@ val of_cmt :
22 Odoc_model.Paths.Identifier.SourcePage .t option ->
33 Odoc_model.Paths.Identifier.RootModule .t ->
44 Cmt_format .cmt_infos ->
5- Shape_ .t option * Odoc_model.Lang.Source_info .infos
5+ Lookup_def .t option * Odoc_model.Lang.Source_info .infos
66(* * Extract all implementation information from a [cmt]: the shape, and the
77 {{!Odoc_model.Lang.Source_info.infos}source infos} (local and global
88 definitions and occurrences).
File renamed without changes.
File renamed without changes.
Original file line number Diff line number Diff line change 11open Result
22module Error = Odoc_model. Error
3- module Shape = Shape_
3+
4+ module Lookup_def = Lookup_def
45
56let read_string parent_definition filename text =
67 let location =
Original file line number Diff line number Diff line change @@ -2,7 +2,7 @@ open Result
22open Odoc_model
33open Odoc_model.Paths
44
5- module Shape = Shape_
5+ module Lookup_def = Lookup_def
66
77type make_root =
88 module_name :string ->
@@ -19,7 +19,7 @@ val read_cmt_infos :
1919 Identifier.SourcePage .t option ->
2020 Identifier.RootModule .t ->
2121 filename :string ->
22- ((Shape .t * Lang.Source_info .infos ) option , Error .t ) result
22+ ((Lookup_def .t * Lang.Source_info .infos ) option , Error .t ) result
2323 Error .with_warnings
2424(* * Read the shape from a .cmt file. *)
2525
@@ -34,7 +34,7 @@ val read_cmt :
3434 parent :Identifier .ContainerPage .t option ->
3535 filename :string ->
3636 source_id_opt :Identifier .SourcePage .t option ->
37- ( Lang.Compilation_unit .t * (Shape .t * Lang.Source_info .infos ) option ,
37+ ( Lang.Compilation_unit .t * (Lookup_def .t * Lang.Source_info .infos ) option ,
3838 Error .t )
3939 result
4040 Error .with_warnings
Original file line number Diff line number Diff line change 1717open Odoc_model
1818open Or_error
1919
20- type unit_content = Lang.Compilation_unit .t * Odoc_loader.Shape .t option
20+ type unit_content = Lang.Compilation_unit .t * Odoc_loader.Lookup_def .t option
2121
2222type content =
2323 | Page_content of Lang.Page .t
Original file line number Diff line number Diff line change 1919open Odoc_model
2020open Or_error
2121
22- type unit_content = Lang.Compilation_unit .t * Odoc_loader.Shape .t option
22+ type unit_content = Lang.Compilation_unit .t * Odoc_loader.Lookup_def .t option
2323
2424(* * Either a page or a module. *)
2525type content =
Original file line number Diff line number Diff line change @@ -235,7 +235,7 @@ let build_compile_env_for_unit
235235 in
236236 let lookup_unit = lookup_unit ~important_digests ~imports_map ap
237237 and lookup_page = lookup_page ap
238- and lookup_def = Odoc_loader.Shape . lookup_def lookup in
238+ and lookup_def = Odoc_loader.Lookup_def . lookup_def lookup in
239239 let resolver = { Env. open_units; lookup_unit; lookup_page; lookup_def } in
240240 Env. env_of_unit m ~linking: false resolver
241241
@@ -247,7 +247,7 @@ let build ?(imports_map = StringMap.empty)
247247 | Some (m , Some shape ) -> Some (m, shape)
248248 | _ -> None
249249 in
250- let lookup_def = Odoc_loader.Shape . lookup_def lookup in
250+ let lookup_def = Odoc_loader.Lookup_def . lookup_def lookup in
251251 let lookup_unit = lookup_unit ~important_digests ~imports_map ap
252252 and lookup_page = lookup_page ap in
253253 { Env. open_units; lookup_unit; lookup_page; lookup_def }
Original file line number Diff line number Diff line change @@ -38,15 +38,15 @@ val lookup_page : t -> string -> Odoc_model.Lang.Page.t option
3838
3939val build_compile_env_for_unit :
4040 t ->
41- Odoc_loader.Shape .t option ->
41+ Odoc_loader.Lookup_def .t option ->
4242 Odoc_model.Lang.Compilation_unit .t ->
4343 Odoc_xref2.Env .t
4444(* * Initialize the environment for compiling the given module. *)
4545
4646val build_link_env_for_unit :
4747 t ->
4848 Odoc_model.Lang.Compilation_unit .t ->
49- Odoc_loader.Shape .t option ->
49+ Odoc_loader.Lookup_def .t option ->
5050 Odoc_xref2.Env .t
5151(* * Initialize the environment for linking the given module. *)
5252
You can’t perform that action at this time.
0 commit comments