{-# OPTIONS_GHC -Wno-orphans #-}

module IsomorphismClass.Relations.ListAndSeq where

import qualified Data.Sequence
import IsomorphismClass.Classes
import IsomorphismClass.Prelude

instance IsomorphicTo [a] (Seq a) where
  to :: Seq a -> [a]
to = Seq a -> [a]
Seq a -> [Item (Seq a)]
forall l. IsList l => l -> [Item l]
toList

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