Skip to content

Commit

Permalink
Formatting
Browse files Browse the repository at this point in the history
  • Loading branch information
jonludlam committed Jun 21, 2023
1 parent d0b3dd3 commit 71fbcdc
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 11 deletions.
5 changes: 1 addition & 4 deletions src/model/paths.mli
Original file line number Diff line number Diff line change
Expand Up @@ -116,10 +116,7 @@ module Identifier : sig
type t = Id.instance_variable
type t_pv = Id.instance_variable_pv
end
module Label :
IdSig
with type t = Id.label
and type t_pv = Id.label_pv
module Label : IdSig with type t = Id.label and type t_pv = Id.label_pv

module Page : sig
type t = Id.page
Expand Down
5 changes: 1 addition & 4 deletions src/model/paths_types.ml
Original file line number Diff line number Diff line change
Expand Up @@ -214,10 +214,7 @@ module Identifier = struct
(** @canonical Odoc_model.Paths.Identifier.NonSrc.t *)

type any_pv =
[ non_src_pv
| source_page_pv
| source_dir_pv
| source_location_pv ]
[ non_src_pv | source_page_pv | source_dir_pv | source_location_pv ]
(** @canonical Odoc_model.Paths.Identifier.t_pv *)

and any = any_pv id
Expand Down
4 changes: 1 addition & 3 deletions src/odoc/compile.ml
Original file line number Diff line number Diff line change
Expand Up @@ -309,9 +309,7 @@ let compile ~resolver ~parent_cli_spec ~hidden ~children ~output
| { Paths.Identifier.iv = `Page _; _ } as parent_id ->
let name = Paths.Identifier.Mk.source_page (parent_id, name) in
if
List.exists
(Paths.Identifier.equal name)
page.source_children
List.exists (Paths.Identifier.equal name) page.source_children
then Ok (Some name)
else err_not_parent ()
| { iv = `LeafPage _; _ } -> err_not_parent ())
Expand Down

0 comments on commit 71fbcdc

Please sign in to comment.