File tree Expand file tree Collapse file tree 9 files changed +13
-13
lines changed Expand file tree Collapse file tree 9 files changed +13
-13
lines changed Original file line number Diff line number Diff line change @@ -6,8 +6,8 @@ loader/cmt.ml
6
6
loader/cmti.ml
7
7
loader/doc_attr.ml
8
8
loader/implementation.ml
9
- loader/shape_ .ml
10
- loader/shape_ .mli
9
+ loader/lookup_def .ml
10
+ loader/lookup_def .mli
11
11
syntax_highlighter/syntax_highlighter.ml
12
12
model/*.cppo.ml
13
13
html_support_files/*.ml
Original file line number Diff line number Diff line change @@ -262,7 +262,7 @@ module Make (Syntax : SYNTAX) = struct
262
262
| Definition id -> (
263
263
match id.iv with
264
264
| `SourceLocation (_ , def ) -> Some (Anchor (DefName. to_string def))
265
- | `SourceLocationInt (_ , local ) ->
265
+ | `SourceLocationInternal (_ , local ) ->
266
266
Some (Anchor (LocalName. to_string local))
267
267
| _ -> None )
268
268
Original file line number Diff line number Diff line change @@ -371,7 +371,7 @@ module Anchor = struct
371
371
| { iv = `SourceLocation (parent , loc ); _ } ->
372
372
let page = Path. from_identifier (parent :> Path.any ) in
373
373
Ok { page; kind = `SourceAnchor ; anchor = DefName. to_string loc }
374
- | { iv = `SourceLocationInt (parent , loc ); _ } ->
374
+ | { iv = `SourceLocationInternal (parent , loc ); _ } ->
375
375
let page = Path. from_identifier (parent :> Path.any ) in
376
376
Ok { page; kind = `SourceAnchor ; anchor = LocalName. to_string loc }
377
377
| { iv = `SourceLocationMod parent ; _ } ->
Original file line number Diff line number Diff line change @@ -419,7 +419,7 @@ let anchor_of_identifier id =
419
419
continue anchor parent
420
420
| `SourceLocationMod _ -> assert false
421
421
| `Result parent -> anchor_of_identifier acc (parent :> Identifier.t )
422
- | `SourceLocationInt _ -> assert false
422
+ | `SourceLocationInternal _ -> assert false
423
423
| `Type (parent , name ) ->
424
424
let anchor = anchor `Type (TypeName. to_string name) in
425
425
continue anchor parent
Original file line number Diff line number Diff line change @@ -58,7 +58,7 @@ module Identifier = struct
58
58
| `SourceLocation (x , anchor ) ->
59
59
name_aux (x :> t ) ^ " #" ^ DefName. to_string anchor
60
60
| `SourceLocationMod x -> name_aux (x :> t )
61
- | `SourceLocationInt (x , anchor ) ->
61
+ | `SourceLocationInternal (x , anchor ) ->
62
62
name_aux (x :> t ) ^ " #" ^ LocalName. to_string anchor
63
63
| `AssetFile (_ , name ) -> name
64
64
@@ -519,9 +519,9 @@ module Identifier = struct
519
519
520
520
let source_location_int :
521
521
SourcePage. t * LocalName. t ->
522
- [> `SourceLocationInt of SourcePage. t * LocalName. t ] id =
522
+ [> `SourceLocationInternal of SourcePage. t * LocalName. t ] id =
523
523
mk_parent LocalName. to_string " sli" (fun (p , n ) ->
524
- `SourceLocationInt (p, n))
524
+ `SourceLocationInternal (p, n))
525
525
end
526
526
end
527
527
Original file line number Diff line number Diff line change @@ -304,7 +304,7 @@ module Identifier : sig
304
304
305
305
val source_location_int :
306
306
SourcePage .t * LocalName .t ->
307
- [> `SourceLocationInt of SourcePage .t * LocalName .t ] id
307
+ [> `SourceLocationInternal of SourcePage .t * LocalName .t ] id
308
308
end
309
309
end
310
310
Original file line number Diff line number Diff line change @@ -43,7 +43,7 @@ module Identifier = struct
43
43
type source_location_pv =
44
44
[ `SourceLocationMod of source_page
45
45
| `SourceLocation of source_page * DefName .t
46
- | `SourceLocationInt of source_page * LocalName .t ]
46
+ | `SourceLocationInternal of source_page * LocalName .t ]
47
47
(* * @canonical Odoc_model.Paths.Identifier.SourceLocation.t *)
48
48
49
49
and source_location = source_location_pv id
Original file line number Diff line number Diff line change @@ -168,9 +168,9 @@ module General_paths = struct
168
168
( " `SourceLocation" ,
169
169
((parent :> id_t ), name),
170
170
Pair (identifier, Names. defname) )
171
- | `SourceLocationInt (parent , name ) ->
171
+ | `SourceLocationInternal (parent , name ) ->
172
172
C
173
- ( " `SourceLocationInt " ,
173
+ ( " `SourceLocationInternal " ,
174
174
((parent :> id_t ), name),
175
175
Pair (identifier, Names. localname) )
176
176
| `SourceLocationMod parent ->
Original file line number Diff line number Diff line change @@ -1255,7 +1255,7 @@ module Fmt = struct
1255
1255
Format. fprintf ppf " %a#%s" model_identifier
1256
1256
(p :> Odoc_model.Paths.Identifier.t )
1257
1257
(DefName. to_string def)
1258
- | `SourceLocationInt (p , def ) ->
1258
+ | `SourceLocationInternal (p , def ) ->
1259
1259
Format. fprintf ppf " %a#%s" model_identifier
1260
1260
(p :> Odoc_model.Paths.Identifier.t )
1261
1261
(LocalName. to_string def)
You can’t perform that action at this time.
0 commit comments