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

Safe HaskellSafe-Inferred
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) 
(Eq a, Show a, Testable b) => Testable ((:=>:) (Equality a) b) 

data a :=>: b infixr 0 Source

Instances

data And a b Source

Instances

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

data Or a b Source

Instances

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

data Neg a Source

Instances

data Forall a b Source

Instances

(Arbitrary a, Show a, Testable b) => Testable (Forall a b) 

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

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

Universal quantification

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

Existential quantification