{-# OPTIONS_GHC -Wno-orphans #-}

module IsomorphismClass.Relations.LazyTextAndText where

import qualified Data.Text.Lazy
import IsomorphismClass.Classes
import IsomorphismClass.Prelude

instance IsomorphicTo Data.Text.Lazy.Text Text where
  to :: Text -> Text
to = Text -> Text
Data.Text.Lazy.fromStrict

instance IsomorphicTo Text Data.Text.Lazy.Text where
  to :: Text -> Text
to = Text -> Text
Data.Text.Lazy.toStrict