Skip to content

Commit

Permalink
Remove unconditional eprintfs and fix a broken reference
Browse files Browse the repository at this point in the history
  • Loading branch information
jonludlam committed Sep 29, 2023
1 parent b04251c commit 2117e8d
Show file tree
Hide file tree
Showing 3 changed files with 1 addition and 4 deletions.
1 change: 0 additions & 1 deletion src/document/generator.ml
Original file line number Diff line number Diff line change
Expand Up @@ -123,7 +123,6 @@ module Make (Syntax : SYNTAX) = struct
link1 ++ O.txt "(" ++ link2 ++ O.txt ")"
| `Resolved _ when Paths.Path.is_hidden path ->
let txt = Url.render_path path in
Format.eprintf "Warning, resolved hidden path: %s\n%!" txt;
unresolved [ inline @@ Text txt ]
| `Resolved rp -> (
(* If the path is pointing to an opaque module or module type
Expand Down
2 changes: 1 addition & 1 deletion src/odoc/fs.mli
Original file line number Diff line number Diff line change
Expand Up @@ -34,7 +34,7 @@ module Directory : sig
val append : t -> t -> t

val reach_from : dir:t -> string -> t
(** @raises Invalid_arg if [parent/name] exists but is not a directory. *)
(** @raises Invalid_argument if [parent/name] exists but is not a directory. *)

val mkdir_p : t -> unit

Expand Down
2 changes: 0 additions & 2 deletions src/xref2/tools.ml
Original file line number Diff line number Diff line change
Expand Up @@ -1900,8 +1900,6 @@ and fragmap :
with
| Ok (p, _) -> Ok (Right p)
| Error e ->
Format.fprintf Format.err_formatter
"failed to resolve path: %a\n%!" Component.Fmt.module_path p;
Error (`UnresolvedPath (`Module (p, e)))
in
map_signature { id_map with module_ = Some (name, mapfn) } sg.items)
Expand Down

0 comments on commit 2117e8d

Please sign in to comment.