ocaml/ocamlbuild/log.ml

82 lines
2.8 KiB
OCaml

(***********************************************************************)
(* *)
(* ocamlbuild *)
(* *)
(* Nicolas Pouillard, Berke Durak, projet Gallium, INRIA Rocquencourt *)
(* *)
(* Copyright 2007 Institut National de Recherche en Informatique et *)
(* en Automatique. All rights reserved. This file is distributed *)
(* under the terms of the GNU Library General Public License, with *)
(* the special exception on linking described in file ../LICENSE. *)
(* *)
(***********************************************************************)
(* Original author: Nicolas Pouillard *)
open My_std
module Debug = struct
let mode _ = true
end
include Debug
let level = ref 1
let classic_display = ref false
let internal_display = ref None
let failsafe_display = lazy (Display.create ~mode:`Classic ~log_level:!level ())
let ( !- ) r =
match !r with
| None -> !*failsafe_display
| Some x -> x
let init log_file =
let mode =
if !classic_display || !*My_unix.is_degraded || !level <= 0 || not (My_unix.stdout_isatty ()) then
`Classic
else
`Sophisticated
in
internal_display := Some (Display.create ~mode ?log_file ~log_level:!level ())
let raw_dprintf log_level = Display.dprintf ~raw:true ~log_level !-internal_display
let dprintf log_level fmt = Display.dprintf ~log_level !-internal_display fmt
let is_logging log_level = Display.is_logging !-internal_display log_level
let eprintf fmt = dprintf (-1) fmt
let update () = Display.update !-internal_display
let event ?pretend x = Display.event !-internal_display ?pretend x
let display x = Display.display !-internal_display x
let do_at_end = Queue.create ()
let already_asked = Hashtbl.create 10
let at_end_always ~name thunk =
if not (Hashtbl.mem already_asked name) then begin
Hashtbl.add already_asked name ();
Queue.add thunk do_at_end;
end
let at_end ~name thunk = at_end_always ~name (function
| `Quiet -> ()
| `Success | `Error -> thunk `Error)
let at_failure ~name thunk = at_end_always ~name (function
| `Success | `Quiet -> ()
| `Error -> thunk `Error)
let finish ?how () =
while not (Queue.is_empty do_at_end) do
let actions = Queue.copy do_at_end in
Queue.clear do_at_end;
(* calling a thunk may add new actions again, hence the loop *)
Queue.iter (fun thunk ->
thunk (match how with None -> `Quiet | Some how -> how)
) actions;
done;
match !internal_display with
| None -> ()
| Some d -> Display.finish ?how d
(*let () = My_unix.at_exit_once finish*)