File tree Expand file tree Collapse file tree 6 files changed +4
-10
lines changed
Expand file tree Collapse file tree 6 files changed +4
-10
lines changed Original file line number Diff line number Diff line change @@ -5,4 +5,4 @@ let _PATH =
55 lazy (Bin. parse_path (Option. value ~default: " " (Unix_env. get Unix_env. initial " PATH" )))
66;;
77
8- let which = Bin. which ~path: (Lazy. force _PATH)
8+ let which x = Bin. which ~path: (Lazy. force _PATH) x |> Option. map ~f: Stdune.Path. to_string
Original file line number Diff line number Diff line change 1- open Import
2-
3- val which : string -> Fpath .t option
1+ val which : string -> string option
Original file line number Diff line number Diff line change @@ -6,7 +6,6 @@ include struct
66 module Code_error = Code_error
77 module Comparable = Comparable
88 module Exn_with_backtrace = Exn_with_backtrace
9- module Fpath = Path
109 module Int = Int
1110 module Table = Table
1211 module Tuple = Tuple
Original file line number Diff line number Diff line change @@ -69,7 +69,6 @@ module Process = struct
6969 ~message: " dune binary not found"
7070 () )
7171 | Some prog ->
72- let prog = Fpath. to_string prog in
7372 let stdin_r, stdin_w = Unix. pipe () in
7473 let stdout_r, stdout_w = Unix. pipe () in
7574 Unix. set_close_on_exec stdin_w;
Original file line number Diff line number Diff line change @@ -136,8 +136,7 @@ let formatter doc =
136136 | `Other -> Code_error. raise " unable to format non merlin document" [] ))
137137;;
138138
139- let exec cancel bin args stdin =
140- let refmt = Fpath. to_string bin in
139+ let exec cancel refmt args stdin =
141140 let + res, cancel = run_command cancel refmt stdin args in
142141 match cancel with
143142 | Cancelled () ->
Original file line number Diff line number Diff line change @@ -24,7 +24,7 @@ module Process : sig
2424
2525 val create
2626 : logger:(type_:MessageType.t -> message:string -> unit Fiber.t )
27- -> bin:Fpath. t
27+ -> bin:string
2828 -> unit
2929 -> (t, [> `No_process ]) result Fiber. t
3030
@@ -62,7 +62,6 @@ end = struct
6262 ;;
6363
6464 let create ~logger ~bin () =
65- let bin = Fpath. to_string bin in
6665 let * pid, stdout, stdin =
6766 let stdin_i, stdin_o = Unix. pipe ~cloexec: true () in
6867 let stdout_i, stdout_o = Unix. pipe ~cloexec: true () in
You can’t perform that action at this time.
0 commit comments