#ifdef __GLASGOW_HASKELL__
#if __GLASGOW_HASKELL__ >= 704
#endif
#if __GLASGOW_HASKELL__ >= 702
#endif
#endif
module Bound.Var
( Var(..)
, unvar
, _B
, _F
) where
#if __GLASGOW_HASKELL__ < 710
import Control.Applicative
#endif
import Control.Monad (liftM, ap)
#if __GLASGOW_HASKELL__ < 710
import Data.Foldable
import Data.Traversable
import Data.Monoid (mempty)
#endif
import Data.Hashable
import Data.Hashable.Extras
import Data.Bifunctor
import Data.Bifoldable
import qualified Data.Binary as Binary
import Data.Binary (Binary)
import Data.Bitraversable
import Data.Bytes.Get
import Data.Bytes.Put
import Data.Bytes.Serial
#ifdef __GLASGOW_HASKELL__
import Data.Data
# if __GLASGOW_HASKELL__ >= 704
import GHC.Generics
# endif
#endif
import Data.Profunctor
import qualified Data.Serialize as Serialize
import Data.Serialize (Serialize)
#if __GLASGOW_HASKELL__ < 710
import Data.Word
#endif
import Prelude.Extras
data Var b a
= B b
| F a
deriving
( Eq
, Ord
, Show
, Read
#ifdef __GLASGOW_HASKELL__
, Data
, Typeable
# if __GLASGOW_HASKELL__ >= 704
, Generic
# endif
#endif
)
distinguisher :: Int
distinguisher = fromIntegral $ (maxBound :: Word) `quot` 3
instance Hashable2 Var
instance Hashable b => Hashable1 (Var b)
instance (Hashable b, Hashable a) => Hashable (Var b a) where
hashWithSalt s (B b) = hashWithSalt s b
hashWithSalt s (F a) = hashWithSalt s a `hashWithSalt` distinguisher
instance Serial2 Var where
serializeWith2 pb _ (B b) = putWord8 0 >> pb b
serializeWith2 _ pf (F f) = putWord8 1 >> pf f
deserializeWith2 gb gf = getWord8 >>= \b -> case b of
0 -> liftM B gb
1 -> liftM F gf
_ -> fail $ "getVar: Unexpected constructor code: " ++ show b
instance Serial b => Serial1 (Var b) where
serializeWith = serializeWith2 serialize
deserializeWith = deserializeWith2 deserialize
instance (Serial b, Serial a) => Serial (Var b a) where
serialize = serializeWith2 serialize serialize
deserialize = deserializeWith2 deserialize deserialize
instance (Binary b, Binary a) => Binary (Var b a) where
put = serializeWith2 Binary.put Binary.put
get = deserializeWith2 Binary.get Binary.get
instance (Serialize b, Serialize a) => Serialize (Var b a) where
put = serializeWith2 Serialize.put Serialize.put
get = deserializeWith2 Serialize.get Serialize.get
unvar :: (b -> r) -> (a -> r) -> Var b a -> r
unvar f _ (B b) = f b
unvar _ g (F a) = g a
_B :: (Choice p, Applicative f) => p b (f b') -> p (Var b a) (f (Var b' a))
_B = dimap (unvar Right (Left . F)) (either pure (fmap B)) . right'
_F :: (Choice p, Applicative f) => p a (f a') -> p (Var b a) (f (Var b a'))
_F = dimap (unvar (Left . B) Right) (either pure (fmap F)) . right'
instance Functor (Var b) where
fmap _ (B b) = B b
fmap f (F a) = F (f a)
instance Foldable (Var b) where
foldMap f (F a) = f a
foldMap _ _ = mempty
instance Traversable (Var b) where
traverse f (F a) = F <$> f a
traverse _ (B b) = pure (B b)
instance Applicative (Var b) where
pure = F
(<*>) = ap
instance Monad (Var b) where
return = F
F a >>= f = f a
B b >>= _ = B b
instance Bifunctor Var where
bimap f _ (B b) = B (f b)
bimap _ g (F a) = F (g a)
instance Bifoldable Var where
bifoldMap f _ (B b) = f b
bifoldMap _ g (F a) = g a
instance Bitraversable Var where
bitraverse f _ (B b) = B <$> f b
bitraverse _ g (F a) = F <$> g a
instance Eq2 Var where
(==##) = (==)
instance Ord2 Var where
compare2 = compare
instance Show2 Var where showsPrec2 = showsPrec
instance Read2 Var where readsPrec2 = readsPrec
instance Eq b => Eq1 (Var b) where
(==#) = (==)
instance Ord b => Ord1 (Var b) where
compare1 = compare
instance Show b => Show1 (Var b) where showsPrec1 = showsPrec
instance Read b => Read1 (Var b) where readsPrec1 = readsPrec