{-# LANGUAGE TypeOperators #-}
module Fcf
(
Exp
, Eval
, type (@@)
, Pure
, Pure1
, Pure2
, Pure3
, Pure4
, Pure5
, Pure6
, Pure7
, Pure8
, Pure9
, type (=<<)
, type (>>=)
, type (<=<)
, LiftM
, LiftM2
, LiftM3
, Join
, type (<$>)
, type (<*>)
, Flip
, ConstFn
, type ($)
, Uncurry
, Fst
, Snd
, type (***)
, UnEither
, IsLeft
, IsRight
, UnMaybe
, FromMaybe
, IsNothing
, IsJust
, type (++)
, Head
, Last
, Tail
, Cons
, Snoc
, Cons2
, Init
, Uncons
, Unsnoc
, Singleton
, Null
, Length
, Reverse
, Intersperse
, Intercalate
, Foldr
, UnList
, Concat
, ConcatMap
, Unfoldr
, Replicate
, Take
, Drop
, SplitAt
, TakeWhile
, DropWhile
, Span
, Break
, Tails
, IsPrefixOf
, IsSuffixOf
, IsInfixOf
, Elem
, Lookup
, Find
, Filter
, Partition
, FindIndex
, SetIndex
, ZipWith
, Zip
, Unzip
, UnBool
, type (||)
, type (&&)
, Not
, Case
, Match()
, type (-->)
, Is
, Any
, Else
, type (+)
, type (-)
, type (Fcf.Data.Nat.*)
, type (^)
, type (<=)
, type (>=)
, type (<)
, type (>)
, Map
, Bimap
, Error
, Constraints
, TyEq
, Stuck
, IsBool(_If)
, If
, Assert
, AssertNot
) where
import Fcf.Core
import Fcf.Combinators
import Fcf.Data.Bool
import Fcf.Data.Common
import Fcf.Data.List
import Fcf.Data.Nat
import Fcf.Class.Functor
import Fcf.Class.Bifunctor
import Fcf.Utils