{-# LANGUAGE GADTs, TypeFamilies, StandaloneDeriving, TypeOperators #-}
module OAlg.Prelude
(
module App
, module Cat
, module Prp
, module Stm
, module X
, module Vlb
, module Vld
, module Bol
, module Eql
, module Myb
, module Shw
, module Nmb
, module Ent
, module Str
, module Dlb
, module Op
, module Ord
, Bounded(..)
, IO, putStrLn
, seq
, undefined, error
, module Exc
)
where
import Prelude( Bounded(..)
, seq
, undefined, error
)
import System.IO (IO,putStrLn)
import OAlg.Control.Exception as Exc
import OAlg.Category.Applicative as App
import OAlg.Category.Definition as Cat
import OAlg.Category.Proposition as Prp
import OAlg.Control.Validate as Vld
import OAlg.Data.Statement as Stm
import OAlg.Data.X as X
import OAlg.Data.Validable as Vlb
import OAlg.Data.Boolean as Bol
import OAlg.Data.Equal as Eql
import OAlg.Data.Maybe as Myb
import OAlg.Data.Show as Shw
import OAlg.Data.Number as Nmb
import OAlg.Data.Dualisable as Dlb
import OAlg.Data.Opposite as Op
import OAlg.Data.Ord as Ord
import OAlg.Entity.Definition as Ent
import OAlg.Structure.Definition as Str