sig
type t = { mutable texpr0 : Texpr0.t; mutable typ : Lincons0.typ; }
type typ = Lincons0.typ = EQ | SUPEQ | SUP | DISEQ | EQMOD of Scalar.t
val make : Texpr0.t -> Tcons0.typ -> Tcons0.t
val copy : Tcons0.t -> Tcons0.t
val string_of_typ : Tcons0.typ -> string
val print :
(Dim.t -> string) -> Stdlib.Format.formatter -> Tcons0.t -> unit
end