module Algebra.Lattice (
    
    JoinSemiLattice(..), MeetSemiLattice(..), Lattice,
    joinLeq, joins1, meetLeq, meets1,
    
    
    BoundedJoinSemiLattice(..), BoundedMeetSemiLattice(..), BoundedLattice,
    joins, meets,
    
    
    lfp, lfpFrom, unsafeLfp,
    gfp, gfpFrom, unsafeGfp,
  ) where
import Algebra.Enumerable
import qualified Algebra.PartialOrd as PO
import qualified Data.Set as S
import qualified Data.IntSet as IS
import qualified Data.Map as M
import qualified Data.IntMap as IM
class JoinSemiLattice a where
    join :: a -> a -> a
joinLeq :: (Eq a, JoinSemiLattice a) => a -> a -> Bool
joinLeq x y = x `join` y == y
joins1 :: JoinSemiLattice a => [a] -> a
joins1 = foldr1 join
class MeetSemiLattice a where
    meet :: a -> a -> a
meetLeq :: (Eq a, MeetSemiLattice a) => a -> a -> Bool
meetLeq x y = x `meet` y == x
meets1 :: MeetSemiLattice a => [a] -> a
meets1 = foldr1 meet
class (JoinSemiLattice a, MeetSemiLattice a) => Lattice a where
class JoinSemiLattice a => BoundedJoinSemiLattice a where
    bottom :: a
joins :: BoundedJoinSemiLattice a => [a] -> a
joins = foldr join bottom
class MeetSemiLattice a => BoundedMeetSemiLattice a where
    top :: a
meets :: BoundedMeetSemiLattice a => [a] -> a
meets = foldr meet top
class (Lattice a, BoundedJoinSemiLattice a, BoundedMeetSemiLattice a) => BoundedLattice a where
instance Ord a => JoinSemiLattice (S.Set a) where
    join = S.union
instance (Ord a, Enumerable a) => MeetSemiLattice (S.Set (Enumerated a)) where
    meet = S.intersection
instance (Ord a, Enumerable a) => Lattice (S.Set (Enumerated a)) where
instance Ord a => BoundedJoinSemiLattice (S.Set a) where
    bottom = S.empty
instance (Ord a, Enumerable a) => BoundedMeetSemiLattice (S.Set (Enumerated a)) where
    top = S.fromList universe
instance (Ord a, Enumerable a) => BoundedLattice (S.Set (Enumerated a)) where
instance JoinSemiLattice IS.IntSet where
    join = IS.union
instance BoundedJoinSemiLattice IS.IntSet where
    bottom = IS.empty
instance (Ord k, JoinSemiLattice v) => JoinSemiLattice (M.Map k v) where
    join = M.unionWith join
instance (Ord k, Enumerable k, MeetSemiLattice v) => MeetSemiLattice (M.Map (Enumerated k) v) where
    meet = M.intersectionWith meet
instance (Ord k, Enumerable k, Lattice v) => Lattice (M.Map (Enumerated k) v) where
instance (Ord k, JoinSemiLattice v) => BoundedJoinSemiLattice (M.Map k v) where
    bottom = M.empty
instance (Ord k, Enumerable k, BoundedMeetSemiLattice v) => BoundedMeetSemiLattice (M.Map (Enumerated k) v) where
    top = M.fromList (universe `zip` repeat top)
instance (Ord k, Enumerable k, BoundedLattice v) => BoundedLattice (M.Map (Enumerated k) v) where
instance JoinSemiLattice v => JoinSemiLattice (IM.IntMap v) where
    join = IM.unionWith join
instance JoinSemiLattice v => BoundedJoinSemiLattice (IM.IntMap v) where
    bottom = IM.empty
instance JoinSemiLattice v => JoinSemiLattice (k -> v) where
    f `join` g = \x -> f x `join` g x
instance MeetSemiLattice v => MeetSemiLattice (k -> v) where
    f `meet` g = \x -> f x `meet` g x
instance Lattice v => Lattice (k -> v) where
instance BoundedJoinSemiLattice v => BoundedJoinSemiLattice (k -> v) where
    bottom = const bottom
instance BoundedMeetSemiLattice v => BoundedMeetSemiLattice (k -> v) where
    top = const top
instance BoundedLattice v => BoundedLattice (k -> v) where
instance (JoinSemiLattice a, JoinSemiLattice b) => JoinSemiLattice (a, b) where
    (x1, y1) `join` (x2, y2) = (x1 `join` x2, y1 `join` y2)
instance (MeetSemiLattice a, MeetSemiLattice b) => MeetSemiLattice (a, b) where
    (x1, y1) `meet` (x2, y2) = (x1 `meet` x2, y1 `meet` y2)
instance (Lattice a, Lattice b) => Lattice (a, b) where
instance (BoundedJoinSemiLattice a, BoundedJoinSemiLattice b) => BoundedJoinSemiLattice (a, b) where
    bottom = (bottom, bottom)
instance (BoundedMeetSemiLattice a, BoundedMeetSemiLattice b) => BoundedMeetSemiLattice (a, b) where
    top = (top, top)
instance (BoundedLattice a, BoundedLattice b) => BoundedLattice (a, b) where
instance JoinSemiLattice Bool where
    join = (||)
instance MeetSemiLattice Bool where
    meet = (&&)
instance Lattice Bool where
instance BoundedJoinSemiLattice Bool where
    bottom = False
instance BoundedMeetSemiLattice Bool where
    top = True
instance BoundedLattice Bool where
unsafeLfp :: (Eq a, BoundedJoinSemiLattice a) => (a -> a) -> a
unsafeLfp = PO.unsafeLfpFrom bottom
lfp :: (Eq a, BoundedJoinSemiLattice a) => (a -> a) -> a
lfp = lfpFrom bottom
lfpFrom :: (Eq a, BoundedJoinSemiLattice a) => a -> (a -> a) -> a
lfpFrom init_x f = PO.unsafeLfpFrom init_x (\x -> f x `join` x)
unsafeGfp :: (Eq a, BoundedMeetSemiLattice a) => (a -> a) -> a
unsafeGfp = PO.unsafeGfpFrom top
gfp :: (Eq a, BoundedMeetSemiLattice a) => (a -> a) -> a
gfp = gfpFrom top
gfpFrom :: (Eq a, BoundedMeetSemiLattice a) => a -> (a -> a) -> a
gfpFrom init_x f = PO.unsafeGfpFrom init_x (\x -> f x `meet` x)