{-# OPTIONS_GHC -Wno-orphans #-}

module IsomorphismClass.Relations.ByteArrayAndWord8List where

import qualified Data.Primitive.ByteArray
import IsomorphismClass.Classes
import IsomorphismClass.Prelude
import IsomorphismClass.Relations.ByteArrayAndShortByteString ()

instance IsomorphicTo Data.Primitive.ByteArray.ByteArray [Word8] where
  to :: [Word8] -> ByteArray
to = [Word8] -> ByteArray
[Item ByteArray] -> ByteArray
forall l. IsList l => [Item l] -> l
fromList

instance IsomorphicTo [Word8] Data.Primitive.ByteArray.ByteArray where
  to :: ByteArray -> [Word8]
to = ByteArray -> [Word8]
ByteArray -> [Item ByteArray]
forall l. IsList l => l -> [Item l]
toList