{-# OPTIONS_GHC -Wno-orphans #-}

module IsomorphismClass.Relations.ByteStringAndWord8List where

import qualified Data.ByteString
import IsomorphismClass.Classes
import IsomorphismClass.Prelude

instance IsomorphicTo ByteString [Word8] where
  to :: [Word8] -> ByteString
to = [Word8] -> ByteString
Data.ByteString.pack

instance IsomorphicTo [Word8] ByteString where
  to :: ByteString -> [Word8]
to = ByteString -> [Word8]
Data.ByteString.unpack