{-# LANGUAGE FlexibleInstances, UndecidableInstances #-}
-- | Warning: this module uses @UndecidableInstances@
module Database.Persist.Cereal.Instances where

import Data.Serialize          (Serialize)
import Database.Persist
import Database.Persist.Cereal as C

instance (Serialize a) => PersistField a where
    toPersistValue = C.toPersistValue
    fromPersistValue = C.fromPersistValue