hol-1.4: Higher order logic
Safe HaskellNone
LanguageHaskell2010

HOL.Print

Description

 

Documentation

type PrefixOp = Doc -> Doc Source #

type Prec = Int Source #

data Assoc Source #

Constructors

LeftAssoc 
RightAssoc 
NonAssoc 

Instances

Instances details
Eq Assoc Source # 
Instance details

Defined in HOL.Print

Methods

(==) :: Assoc -> Assoc -> Bool #

(/=) :: Assoc -> Assoc -> Bool #

Ord Assoc Source # 
Instance details

Defined in HOL.Print

Methods

compare :: Assoc -> Assoc -> Ordering #

(<) :: Assoc -> Assoc -> Bool #

(<=) :: Assoc -> Assoc -> Bool #

(>) :: Assoc -> Assoc -> Bool #

(>=) :: Assoc -> Assoc -> Bool #

max :: Assoc -> Assoc -> Assoc #

min :: Assoc -> Assoc -> Assoc #

Show Assoc Source # 
Instance details

Defined in HOL.Print

Methods

showsPrec :: Int -> Assoc -> ShowS #

show :: Assoc -> String #

showList :: [Assoc] -> ShowS #

type InfixOp = (Prec, Assoc, Doc -> Doc) Source #

ppInfixOps :: (a -> Maybe (InfixOp, a, a)) -> (Bool -> a -> Doc) -> Bool -> a -> Doc Source #

class Printable a where Source #

Minimal complete definition

toDoc

Methods

toDoc :: a -> Doc Source #

toStringWith :: Style -> a -> String Source #

toString :: a -> String Source #

Instances

Instances details
Printable Integer Source # 
Instance details

Defined in HOL.Print

Printable Doc Source # 
Instance details

Defined in HOL.Print

Printable Name Source # 
Instance details

Defined in HOL.Print

Printable Namespace Source # 
Instance details

Defined in HOL.Print

Printable Term Source # 
Instance details

Defined in HOL.Print

Printable Const Source # 
Instance details

Defined in HOL.Print

Printable Var Source # 
Instance details

Defined in HOL.Print

Printable Type Source # 
Instance details

Defined in HOL.Print

Printable TypeOp Source # 
Instance details

Defined in HOL.Print

Printable TypeVar Source # 
Instance details

Defined in HOL.Print

Printable TypeSubst Source # 
Instance details

Defined in HOL.Print

Printable TermAlpha Source # 
Instance details

Defined in HOL.Print

Printable Sequent Source # 
Instance details

Defined in HOL.Print

Printable Thm Source # 
Instance details

Defined in HOL.Print

Printable Theory Source # 
Instance details

Defined in HOL.Theory

Printable Interpret Source # 
Instance details

Defined in HOL.OpenTheory.Interpret

Printable Renames Source # 
Instance details

Defined in HOL.OpenTheory.Interpret

Printable Rename Source # 
Instance details

Defined in HOL.OpenTheory.Interpret

Printable Symbol Source # 
Instance details

Defined in HOL.OpenTheory.Interpret

Printable State Source # 
Instance details

Defined in HOL.OpenTheory.Article

Printable Command Source # 
Instance details

Defined in HOL.OpenTheory.Article

Printable Object Source # 
Instance details

Defined in HOL.OpenTheory.Article

Printable Number Source # 
Instance details

Defined in HOL.OpenTheory.Article

Printable Package Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable Block Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable File Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable Info Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable KeyValue Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable NameVersion Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable Version Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable Name Source # 
Instance details

Defined in HOL.OpenTheory.Package

Printable a => Printable [a] Source # 
Instance details

Defined in HOL.Print

Methods

toDoc :: [a] -> Doc Source #

toStringWith :: Style -> [a] -> String Source #

toString :: [a] -> String Source #

Printable a => Printable (Set a) Source # 
Instance details

Defined in HOL.Print

(Printable a, Printable b) => Printable (a, b) Source # 
Instance details

Defined in HOL.Print

Methods

toDoc :: (a, b) -> Doc Source #

toStringWith :: Style -> (a, b) -> String Source #

toString :: (a, b) -> String Source #