Skip to content

Commit 82c5e10

Browse files
committed
Driver: update to new html-generate-source command
1 parent 6eb6b25 commit 82c5e10

File tree

3 files changed

+8
-10
lines changed

3 files changed

+8
-10
lines changed

src/driver/compile.ml

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -236,7 +236,7 @@ let html_generate output_dir linked =
236236
match l.kind with
237237
| `Intf { hidden = true; _ } -> ()
238238
| `Impl { src_path; _ } ->
239-
Odoc.html_generate_impl ~search_uris:[] ~output_dir ~input_file
239+
Odoc.html_generate_source ~search_uris:[] ~output_dir ~input_file
240240
~source:src_path ();
241241
Atomic.incr Stats.stats.generated_units
242242
| _ ->

src/driver/odoc.ml

Lines changed: 5 additions & 7 deletions
Original file line numberDiff line numberDiff line change
@@ -153,26 +153,24 @@ let html_generate ~output_dir ?index ?(ignore_output = false) ?(assets = [])
153153
Cmd_outputs.(
154154
add_prefixed_output cmd generate_output (Fpath.to_string file) lines)
155155

156-
let html_generate_impl ~output_dir ?(ignore_output = false) ?source
156+
let html_generate_source ~output_dir ?(ignore_output = false) ~source
157157
?(search_uris = []) ~input_file:file () =
158158
let open Cmd in
159-
let source =
160-
match source with None -> empty | Some source -> v "--source" % p source
161-
in
159+
let file = v "--impl" % p file in
162160
let search_uris =
163161
List.fold_left
164162
(fun acc filename -> acc % "--search-uri" % p filename)
165163
empty search_uris
166164
in
167165
let cmd =
168-
!odoc % "html-generate-impl" %% source % p file %% search_uris % "-o"
166+
!odoc % "html-generate-impl" %% file % p source %% search_uris % "-o"
169167
% output_dir
170168
in
171-
let desc = Printf.sprintf "Generating HTML for %s" (Fpath.to_string file) in
169+
let desc = Printf.sprintf "Generating HTML for %s" (Fpath.to_string source) in
172170
let lines = Cmd_outputs.submit desc cmd None in
173171
if not ignore_output then
174172
Cmd_outputs.(
175-
add_prefixed_output cmd generate_output (Fpath.to_string file) lines)
173+
add_prefixed_output cmd generate_output (Fpath.to_string source) lines)
176174

177175
let support_files path =
178176
let open Cmd in

src/driver/odoc.mli

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -54,10 +54,10 @@ val html_generate :
5454
unit ->
5555
unit
5656

57-
val html_generate_impl :
57+
val html_generate_source :
5858
output_dir:string ->
5959
?ignore_output:bool ->
60-
?source:Fpath.t ->
60+
source:Fpath.t ->
6161
?search_uris:Fpath.t list ->
6262
input_file:Fpath.t ->
6363
unit ->

0 commit comments

Comments
 (0)