module Data.Sext.Class
( Sextable(..)
)
where
import Prelude
import qualified Prelude as P
#ifdef WITH_BS
import qualified Data.ByteString as B
import GHC.Word
import qualified Data.ByteString.Short as BS
#endif
#ifdef WITH_TEXT
import qualified Data.Text as T
#endif
#ifdef WITH_VECTOR
import qualified Data.Vector as V
#endif
#if MIN_VERSION_base(4,9,0)
import GHC.TypeLits hiding (Text)
#else
import GHC.TypeLits
#endif
class Sextable a where
data Sext (i :: Nat) a
type Elem a
unsafeCreate :: a -> Sext i a
unwrap :: Sext i a -> a
length :: a -> Int
append :: a -> a -> a
replicate :: Int -> Elem a -> a
map :: (Elem a -> Elem a) -> a -> a
take :: Int -> a -> a
drop :: Int -> a -> a
instance (Show a, Sextable a) => Show (Sext i a) where
show = show . unwrap
showsPrec p = showsPrec p . unwrap
instance Sextable [a] where
type Elem [a] = a
data Sext i [a] = List [a]
deriving (Eq, Ord)
unsafeCreate = List
unwrap (List l) = l
length = P.length
append = (P.++)
replicate = P.replicate
map = P.map
take = P.take
drop = P.drop
#ifdef WITH_TEXT
instance Sextable T.Text where
type Elem T.Text = Char
data Sext i T.Text = Text T.Text
deriving (Eq, Ord)
unsafeCreate = Text
unwrap (Text t) = t
length = T.length
append = T.append
replicate = \n c -> T.replicate n (T.singleton c)
map = T.map
take = T.take
drop = T.drop
#endif
#ifdef WITH_BS
instance Sextable B.ByteString where
type Elem B.ByteString = Word8
data Sext i B.ByteString = ByteString B.ByteString
deriving (Eq, Ord)
unsafeCreate = ByteString
unwrap (ByteString t) = t
length = B.length
append = B.append
replicate = B.replicate
map = B.map
take = B.take
drop = B.drop
instance Sextable BS.ShortByteString where
type Elem BS.ShortByteString = Word8
data Sext i BS.ShortByteString = ByteStringS BS.ShortByteString
deriving (Eq, Ord)
unsafeCreate = ByteStringS
unwrap (ByteStringS t) = t
length = BS.length
append a b = BS.toShort $ B.append (BS.fromShort a) (BS.fromShort b)
replicate n = BS.toShort . B.replicate n
map f = BS.toShort . B.map f . BS.fromShort
take n = BS.toShort . B.take n . BS.fromShort
drop n = BS.toShort . B.drop n . BS.fromShort
#endif
#ifdef WITH_VECTOR
instance Sextable (V.Vector a) where
type Elem (V.Vector a) = a
data Sext i (V.Vector a) = Vector (V.Vector a)
deriving (Eq, Ord)
unsafeCreate = Vector
unwrap (Vector t) = t
length = V.length
append = (V.++)
replicate = V.replicate
map = V.map
take = V.take
drop = V.drop
#endif