[police] open IStd everywhere

Summary: `IStd` shall prevail.

Reviewed By: jberdine

Differential Revision: D5182263

fbshipit-source-id: f579046
master
Jules Villard 8 years ago committed by Facebook Github Bot
parent a121e4bb01
commit b50f9f2695

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
type t = {
introduced : Jsonbug_t.report;
fixed : Jsonbug_t.report;

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
module FileRenamings :
sig
type renaming = {

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
(** used to combine pp together, wrap content into a monospaced block *)
val wrap_monospaced : (Format.formatter -> 'a -> unit) -> Format.formatter -> 'a -> unit

@ -7,13 +7,15 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
type t [@@deriving compare]
(** Maps from source_file *)
module Map : Map.S with type key = t
module Map : Caml.Map.S with type key = t
(** Set of source files *)
module Set : Set.S with type elt = t
module Set : Caml.Set.S with type elt = t
module UNSAFE : sig
(** Create a SourceFile from any path. This is unchecked and should not be

@ -10,6 +10,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
module F = Format
module Allocsite =
@ -33,8 +35,8 @@ struct
| Var v ->
Var.pp F.str_formatter v;
let s = F.flush_str_formatter () in
if s.[0] = '&' then
F.fprintf fmt "%s" (String.sub s 1 (String.length s - 1))
if Char.equal s.[0] '&' then
F.fprintf fmt "%s" (String.sub s ~pos:1 ~len:(String.length s - 1))
else F.fprintf fmt "%s" s
| Allocsite a -> Allocsite.pp fmt a
| Field (l, f) -> F.fprintf fmt "%a.%a" pp l Fieldname.pp f

@ -7,4 +7,6 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val checker : Callbacks.proc_callback_t

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
module CallSites = AbstractDomain.FiniteSet (CallSite)
module SinkMap = AbstractDomain.Map (Typ.Procname) (CallSites)

@ -9,5 +9,7 @@
(* Module that define preanalysis to derive nullability annotations *)
open! IStd
(* Analysis the cfg and updates the tenv with nullability annotations *)
val analysis : Cfg.cfg -> Tenv.t -> unit

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val file_analysis : Callbacks.cluster_callback_t
val analyze_procedure : Callbacks.proc_callback_t

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
(** tree of (trace, access path) associations organized by structure of access paths *)
module type S = sig
module TraceDomain : AbstractDomain.WithBottom

@ -7,4 +7,6 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val checker : Callbacks.proc_callback_t

@ -7,4 +7,6 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val callback_fragment_retains_view : Callbacks.proc_callback_t

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
module type Payload = sig
type payload

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
type machine_readable_version = float
type human_readable_version = string
type t = machine_readable_version * human_readable_version

@ -8,6 +8,8 @@
*)
{
open! IStd
open Lexing
open Ctl_parser

@ -9,6 +9,8 @@
%{
open! IStd
let formal_params : (ALVar.t list) ref = ref []
let is_not_infer_reserved_id id =
@ -19,7 +21,7 @@
else ()
let is_defined_identifier id =
if (List.mem (ALVar.Var id) !formal_params) then
if (List.mem ~equal:ALVar.equal !formal_params (ALVar.Var id)) then
Logging.out "\tParsed exp '%s' as variable" id
else
raise (Ctl_parser_types.ALParsingException
@ -149,7 +151,7 @@ clause:
| "severity" -> ALVar.Severity
| "mode" -> ALVar.Mode
| "path" -> ALVar.Path
| _ -> IStd.failwithf "[ERROR] string '%s' cannot be set in a SET clause. \
| _ -> failwithf "[ERROR] string '%s' cannot be set in a SET clause. \
Use either of: \
'message', 'mode', 'severity', 'suggestion' or 'path'" $2 in
CTL.CDesc (alvar, $4) }

@ -9,6 +9,8 @@
(* Types used by the ctl parser *)
open! IStd
(** the kind of AST nodes where formulas are evaluated *)
type ast_node =
| Stmt of Clang_ast_t.stmt

@ -8,6 +8,8 @@
*)
{
open! IStd
open Lexing
open Types_parser

@ -8,6 +8,8 @@
*/
%{
open! IStd
open Ctl_parser_types
(* See StringRef BuiltinType::getName in

@ -6,4 +6,7 @@
* LICENSE file in the root directory of this source tree. An additional grant
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
let exe ~prog:_ ~args:_ = ()

@ -7,9 +7,10 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
(** Method signature with annotations. *)
open! IStd
type t = {
ret : Annot.Item.t * Typ.t; (** Annotated return type. *)
params: (Mangled.t * Annot.Item.t * Typ.t) list; (** Annotated parameters. *)

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
(** is this a Buck target string, eg //foo/bar:baz or boo//foo/bar:baz *)
val is_target_string : string -> bool

@ -6,4 +6,7 @@
* LICENSE file in the root directory of this source tree. An additional grant
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val capture : prog:string -> args:string list -> unit

@ -7,5 +7,7 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
let from_arguments _ = ()
let from_verbose_out _ = ()

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
module DeprecatedAPIUsage = struct
let checker _ _ = None
end

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
module DeprecatedAPIUsage :
sig
val checker :

@ -7,4 +7,6 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val checker : Callbacks.proc_callback_t

@ -7,4 +7,6 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val checker : Callbacks.proc_callback_t

@ -7,6 +7,8 @@
* of patent rights can be found in the PATENTS file in the same directory.
*)
open! IStd
val make_var : string -> Pvar.t
val make_fieldname : string -> Fieldname.t

Loading…
Cancel
Save