{-# LANGUAGE DeriveDataTypeable #-}
module HolLight.Sublogic where

import Data.Typeable

-- | sublogic

data HolLightSL = Top deriving (Int -> HolLightSL -> ShowS
[HolLightSL] -> ShowS
HolLightSL -> String
(Int -> HolLightSL -> ShowS)
-> (HolLightSL -> String)
-> ([HolLightSL] -> ShowS)
-> Show HolLightSL
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [HolLightSL] -> ShowS
$cshowList :: [HolLightSL] -> ShowS
show :: HolLightSL -> String
$cshow :: HolLightSL -> String
showsPrec :: Int -> HolLightSL -> ShowS
$cshowsPrec :: Int -> HolLightSL -> ShowS
Show, HolLightSL -> HolLightSL -> Bool
(HolLightSL -> HolLightSL -> Bool)
-> (HolLightSL -> HolLightSL -> Bool) -> Eq HolLightSL
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: HolLightSL -> HolLightSL -> Bool
$c/= :: HolLightSL -> HolLightSL -> Bool
== :: HolLightSL -> HolLightSL -> Bool
$c== :: HolLightSL -> HolLightSL -> Bool
Eq, Eq HolLightSL
Eq HolLightSL =>
(HolLightSL -> HolLightSL -> Ordering)
-> (HolLightSL -> HolLightSL -> Bool)
-> (HolLightSL -> HolLightSL -> Bool)
-> (HolLightSL -> HolLightSL -> Bool)
-> (HolLightSL -> HolLightSL -> Bool)
-> (HolLightSL -> HolLightSL -> HolLightSL)
-> (HolLightSL -> HolLightSL -> HolLightSL)
-> Ord HolLightSL
HolLightSL -> HolLightSL -> Bool
HolLightSL -> HolLightSL -> Ordering
HolLightSL -> HolLightSL -> HolLightSL
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: HolLightSL -> HolLightSL -> HolLightSL
$cmin :: HolLightSL -> HolLightSL -> HolLightSL
max :: HolLightSL -> HolLightSL -> HolLightSL
$cmax :: HolLightSL -> HolLightSL -> HolLightSL
>= :: HolLightSL -> HolLightSL -> Bool
$c>= :: HolLightSL -> HolLightSL -> Bool
> :: HolLightSL -> HolLightSL -> Bool
$c> :: HolLightSL -> HolLightSL -> Bool
<= :: HolLightSL -> HolLightSL -> Bool
$c<= :: HolLightSL -> HolLightSL -> Bool
< :: HolLightSL -> HolLightSL -> Bool
$c< :: HolLightSL -> HolLightSL -> Bool
compare :: HolLightSL -> HolLightSL -> Ordering
$ccompare :: HolLightSL -> HolLightSL -> Ordering
$cp1Ord :: Eq HolLightSL
Ord, Typeable)