Skip to content

Commit 7e29c2f

Browse files
committed
remind us not using Location.print_warning in Buckle codebase
1 parent 1e5b4ee commit 7e29c2f

File tree

1 file changed

+3
-3
lines changed

1 file changed

+3
-3
lines changed

parsing/location.mli

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -58,8 +58,10 @@ val get_pos_info: Lexing.position -> string * int * int (* file, line, char *)
5858
val print_loc: formatter -> t -> unit
5959
val print_error: formatter -> t -> unit
6060
val print_error_cur_file: formatter -> unit -> unit
61+
#if undefined BS_ONLY then (* Not using below APIs in ReScript *)
6162
val print_warning: t -> formatter -> Warnings.t -> unit
6263
val formatter_for_warnings : formatter ref
64+
#end
6365
val prerr_warning: t -> Warnings.t -> unit
6466
val echo_eof: unit -> unit
6567
val reset: unit -> unit
@@ -73,8 +75,6 @@ val warning_printer : (t -> formatter -> Warnings.t -> unit) ref
7375
val default_warning_printer : t -> formatter -> Warnings.t -> unit
7476
(** Original warning printer for use in hooks. *)
7577

76-
val highlight_locations: formatter -> t list -> bool
77-
7878
type 'a loc = {
7979
txt : 'a;
8080
loc : t;
@@ -111,7 +111,7 @@ exception Error of error
111111

112112
val error: ?loc:t -> ?sub:error list -> ?if_highlight:string -> string -> error
113113

114-
#if undefined BS_NO_COMPILER_PATCH then
114+
#if true then
115115
val print_error_prefix : Format.formatter -> unit
116116
val pp_ksprintf : ?before:(formatter -> unit) -> (string -> 'a) -> ('b, formatter, unit, 'a) format4 -> 'b
117117
#end

0 commit comments

Comments
 (0)