tip-haskell-frontend-0.2: Convert from Haskell to Tip

Safe HaskellSafe
LanguageHaskell2010

Tip

Description

The language properties are expressed in in the Haskell source

Synopsis

Documentation

data Equality a Source

The property data type

Instances

(Eq a, Show a) => Testable (Equality a) Source 
(Eq a, Show a, Testable b) => Testable ((:=>:) (Equality a) b) Source 

data a :=>: b infixr 0 Source

data And a b Source

Instances

(Testable a, Testable b) => Testable (And a b) Source 

data Or a b Source

Instances

(Testable a, Testable b) => Testable (Or a b) Source 

data Forall a b Source

Instances

data Exists a b Source

(===) :: a -> a -> Equality a infix 3 Source

Equality

(=/=) :: a -> a -> Neg (Equality a) infix 3 Source

Inequality

bool :: Bool -> Equality Bool Source

A synonym for ===, but for booleans

(==>) :: a -> b -> a :=>: b infixr 0 Source

Implication

(.&&.) :: a -> b -> And a b infixr 2 Source

Conjunction

(.||.) :: a -> b -> Or a b infixr 1 Source

Disjunction

neg :: a -> Neg a Source

Negation

question :: a -> Neg a Source

Question (same as negation)

forAll :: (a -> b) -> Forall a b Source

Universal quantification

exists :: (a -> b) -> Exists a b Source

Existential quantification