Summary: There are a number if issues with using the same type for expressions in code and in formulas. One is that the type systems of the two should be different. Another is that conflating the two compromises the ability of Llair to correctly express aspects such as integer overflow, floating point rounding, etc. Also, it could be beneficial to have more source locations for program expressions than makes sense for terms. This diff simply unshares Exp, leading to a copy named Term. Likewise, Reg is now a copy of Var. Simplifications to come. Reviewed By: bennostein Differential Revision: D17665250 fbshipit-source-id: 4359a80d5master
parent
13c06e4dd3
commit
442c8e92f4
@ -0,0 +1,10 @@
|
||||
(*
|
||||
* Copyright (c) Facebook, Inc. and its affiliates.
|
||||
*
|
||||
* This source code is licensed under the MIT license found in the
|
||||
* LICENSE file in the root directory of this source tree.
|
||||
*)
|
||||
|
||||
(** Variables *)
|
||||
|
||||
include Exp.Reg
|
@ -0,0 +1,10 @@
|
||||
(*
|
||||
* Copyright (c) Facebook, Inc. and its affiliates.
|
||||
*
|
||||
* This source code is licensed under the MIT license found in the
|
||||
* LICENSE file in the root directory of this source tree.
|
||||
*)
|
||||
|
||||
(** Variables *)
|
||||
|
||||
include module type of Exp.Reg
|
File diff suppressed because it is too large
Load Diff
@ -0,0 +1,219 @@
|
||||
(*
|
||||
* Copyright (c) Facebook, Inc. and its affiliates.
|
||||
*
|
||||
* This source code is licensed under the MIT license found in the
|
||||
* LICENSE file in the root directory of this source tree.
|
||||
*)
|
||||
|
||||
(** Terms
|
||||
|
||||
Pure (heap-independent) terms are complex arithmetic, bitwise-logical,
|
||||
etc. operations over literal values and variables.
|
||||
|
||||
Terms for operations that are uninterpreted in the analyzer are
|
||||
represented in curried form, where [App] is an application of a function
|
||||
symbol to an argument. This is done to simplify the definition of
|
||||
'subterm' and make it explicit. The specific constructor functions
|
||||
indicate and check the expected arity of the function symbols. *)
|
||||
|
||||
type comparator_witness
|
||||
|
||||
type qset = (t, comparator_witness) Qset.t
|
||||
|
||||
and t = private
|
||||
| Add of {args: qset; typ: Typ.t} (** Addition *)
|
||||
| Mul of {args: qset; typ: Typ.t} (** Multiplication *)
|
||||
| Splat of {byt: t; siz: t}
|
||||
(** Iterated concatenation of a single byte *)
|
||||
| Memory of {siz: t; arr: t} (** Size-tagged byte-array *)
|
||||
| Concat of {args: t vector} (** Byte-array concatenation *)
|
||||
| Var of {id: int; name: string} (** Local variable / virtual register *)
|
||||
| Nondet of {msg: string}
|
||||
(** Anonymous local variable with arbitrary value, representing
|
||||
non-deterministic approximation of value described by [msg] *)
|
||||
| Label of {parent: string; name: string}
|
||||
(** Address of named code block within parent function *)
|
||||
| App of {op: t; arg: t}
|
||||
(** Application of function symbol to argument, curried *)
|
||||
| Eq (** Equal test *)
|
||||
| Dq (** Disequal test *)
|
||||
| Gt (** Greater-than test *)
|
||||
| Ge (** Greater-than-or-equal test *)
|
||||
| Lt (** Less-than test *)
|
||||
| Le (** Less-than-or-equal test *)
|
||||
| Ugt (** Unsigned greater-than test *)
|
||||
| Uge (** Unsigned greater-than-or-equal test *)
|
||||
| Ult (** Unsigned less-than test *)
|
||||
| Ule (** Unsigned less-than-or-equal test *)
|
||||
| Ord (** Ordered test (neither arg is nan) *)
|
||||
| Uno (** Unordered test (some arg is nan) *)
|
||||
| Div (** Division *)
|
||||
| Udiv (** Unsigned division *)
|
||||
| Rem (** Remainder of division *)
|
||||
| Urem (** Remainder of unsigned division *)
|
||||
| And (** Conjunction, boolean or bitwise *)
|
||||
| Or (** Disjunction, boolean or bitwise *)
|
||||
| Xor (** Exclusive-or, bitwise *)
|
||||
| Shl (** Shift left, bitwise *)
|
||||
| Lshr (** Logical shift right, bitwise *)
|
||||
| Ashr (** Arithmetic shift right, bitwise *)
|
||||
| Conditional (** If-then-else *)
|
||||
| Record (** Record (array / struct) constant *)
|
||||
| Select (** Select an index from a record *)
|
||||
| Update (** Constant record with updated index *)
|
||||
| Struct_rec of {elts: t vector}
|
||||
(** Struct constant that may recursively refer to itself
|
||||
(transitively) from [elts]. NOTE: represented by cyclic values. *)
|
||||
| Convert of {signed: bool; dst: Typ.t; src: Typ.t}
|
||||
(** Convert between specified types, possibly with loss of information *)
|
||||
| Integer of {data: Z.t; typ: Typ.t}
|
||||
(** Integer constant, or if [typ] is a [Pointer], null pointer value
|
||||
that never refers to an object *)
|
||||
| Float of {data: string} (** Floating-point constant *)
|
||||
[@@deriving compare, equal, hash, sexp]
|
||||
|
||||
val comparator : (t, comparator_witness) Comparator.t
|
||||
|
||||
type term = t
|
||||
|
||||
val pp_full : ?is_x:(term -> bool) -> t pp
|
||||
val pp : t pp
|
||||
val invariant : ?partial:bool -> t -> unit
|
||||
|
||||
(** Term.Var is re-exported as Var *)
|
||||
module Var : sig
|
||||
type t = private term [@@deriving compare, equal, hash, sexp]
|
||||
type var = t
|
||||
|
||||
include Comparator.S with type t := t
|
||||
|
||||
module Set : sig
|
||||
type t = (var, comparator_witness) Set.t
|
||||
[@@deriving compare, equal, sexp]
|
||||
|
||||
val pp_full : ?is_x:(term -> bool) -> t pp
|
||||
val pp : t pp
|
||||
val empty : t
|
||||
val of_option : var option -> t
|
||||
val of_list : var list -> t
|
||||
val of_vector : var vector -> t
|
||||
val of_regs : Reg.Set.t -> t
|
||||
end
|
||||
|
||||
module Map : sig
|
||||
type 'a t = (var, 'a, comparator_witness) Map.t
|
||||
[@@deriving compare, equal, sexp]
|
||||
|
||||
val empty : 'a t
|
||||
end
|
||||
|
||||
val pp : t pp
|
||||
val pp_demangled : t pp
|
||||
|
||||
include Invariant.S with type t := t
|
||||
|
||||
val of_reg : Reg.t -> t
|
||||
val of_term : term -> t option
|
||||
val program : string -> t
|
||||
val fresh : string -> wrt:Set.t -> t * Set.t
|
||||
val id : t -> int
|
||||
val name : t -> string
|
||||
|
||||
module Subst : sig
|
||||
type t [@@deriving compare, equal, sexp]
|
||||
|
||||
val pp : t pp
|
||||
val empty : t
|
||||
val freshen : Set.t -> wrt:Set.t -> t
|
||||
val extend : t -> replace:var -> with_:var -> t
|
||||
val invert : t -> t
|
||||
val exclude : t -> Set.t -> t
|
||||
val restrict : t -> Set.t -> t
|
||||
val is_empty : t -> bool
|
||||
val domain : t -> Set.t
|
||||
val range : t -> Set.t
|
||||
val apply_set : t -> Set.t -> Set.t
|
||||
val close_set : t -> Set.t -> Set.t
|
||||
end
|
||||
end
|
||||
|
||||
(** Construct *)
|
||||
|
||||
val of_exp : Exp.t -> t
|
||||
val var : Var.t -> t
|
||||
val nondet : string -> t
|
||||
val label : parent:string -> name:string -> t
|
||||
val null : t
|
||||
val splat : byt:t -> siz:t -> t
|
||||
val memory : siz:t -> arr:t -> t
|
||||
val concat : t array -> t
|
||||
val bool : bool -> t
|
||||
val integer : Z.t -> Typ.t -> t
|
||||
val rational : Q.t -> Typ.t -> t
|
||||
val float : string -> t
|
||||
val eq : t -> t -> t
|
||||
val dq : t -> t -> t
|
||||
val gt : t -> t -> t
|
||||
val ge : t -> t -> t
|
||||
val lt : t -> t -> t
|
||||
val le : t -> t -> t
|
||||
val ugt : t -> t -> t
|
||||
val uge : t -> t -> t
|
||||
val ult : t -> t -> t
|
||||
val ule : t -> t -> t
|
||||
val ord : t -> t -> t
|
||||
val uno : t -> t -> t
|
||||
val neg : Typ.t -> t -> t
|
||||
val add : Typ.t -> t -> t -> t
|
||||
val sub : Typ.t -> t -> t -> t
|
||||
val mul : Typ.t -> t -> t -> t
|
||||
val div : t -> t -> t
|
||||
val udiv : t -> t -> t
|
||||
val rem : t -> t -> t
|
||||
val urem : t -> t -> t
|
||||
val and_ : t -> t -> t
|
||||
val or_ : t -> t -> t
|
||||
val xor : t -> t -> t
|
||||
val not_ : Typ.t -> t -> t
|
||||
val shl : t -> t -> t
|
||||
val lshr : t -> t -> t
|
||||
val ashr : t -> t -> t
|
||||
val conditional : cnd:t -> thn:t -> els:t -> t
|
||||
val record : t list -> t
|
||||
val select : rcd:t -> idx:t -> t
|
||||
val update : rcd:t -> elt:t -> idx:t -> t
|
||||
|
||||
val struct_rec :
|
||||
(module Hashtbl.Key with type t = 'id)
|
||||
-> (id:'id -> t lazy_t vector -> t) Staged.t
|
||||
(** [struct_rec Id id element_thunks] constructs a possibly-cyclic [Struct]
|
||||
value. Cycles are detected using [Id]. The caller of [struct_rec Id]
|
||||
must ensure that a single unstaging of [struct_rec Id] is used for each
|
||||
complete cyclic value. Also, the caller must ensure that recursive calls
|
||||
to [struct_rec Id] provide [id] values that uniquely identify at least
|
||||
one point on each cycle. Failure to obey these requirements will lead to
|
||||
stack overflow. *)
|
||||
|
||||
val convert : ?signed:bool -> dst:Typ.t -> src:Typ.t -> t -> t
|
||||
val size_of : Typ.t -> t option
|
||||
|
||||
(** Access *)
|
||||
|
||||
val iter : t -> f:(t -> unit) -> unit
|
||||
val fold_vars : t -> init:'a -> f:('a -> Var.t -> 'a) -> 'a
|
||||
val fold_terms : t -> init:'a -> f:('a -> t -> 'a) -> 'a
|
||||
val fold : t -> init:'a -> f:(t -> 'a -> 'a) -> 'a
|
||||
|
||||
(** Transform *)
|
||||
|
||||
val map : t -> f:(t -> t) -> t
|
||||
val rename : Var.Subst.t -> t -> t
|
||||
|
||||
(** Query *)
|
||||
|
||||
val fv : t -> Var.Set.t
|
||||
val is_true : t -> bool
|
||||
val is_false : t -> bool
|
||||
val typ : t -> Typ.t option
|
||||
val classify : t -> [> `Atomic | `Interpreted | `Simplified | `Uninterpreted]
|
||||
val solve : t -> t -> (t, t, comparator_witness) Map.t option
|
Loading…
Reference in new issue