{-# OPTIONS_GHC -Wno-orphans #-}

module IsomorphismClass.Relations.BoxedVectorAndList where

import qualified Data.Vector
import IsomorphismClass.Classes
import IsomorphismClass.Prelude

instance IsomorphicTo (Vector a) [a] where
  to :: [a] -> Vector a
to = [a] -> Vector a
forall a. [a] -> Vector a
Data.Vector.fromList

instance IsomorphicTo [a] (Vector a) where
  to :: Vector a -> [a]
to = Vector a -> [a]
forall a. Vector a -> [a]
Data.Vector.toList