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