{-# LANGUAGE ConstraintKinds #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE TypeFamilies #-}
{-# OPTIONS_GHC -Wno-duplicate-exports #-}
module Cardano.Api.HasTypeProxy
( HasTypeProxy (AsType, proxyToAsType)
, asType
, AsType (..)
, Proxy (..)
, FromSomeType (..)
)
where
import Data.ByteString qualified as BS
import Data.Kind (Constraint, Type)
import Data.Proxy (Proxy (..))
import Data.Typeable (Typeable)
import Data.Word (Word16, Word8)
class Typeable t => HasTypeProxy t where
data AsType t
proxyToAsType :: Proxy t -> AsType t
instance HasTypeProxy Word8 where
data AsType Word8 = AsWord8
proxyToAsType :: Proxy Word8 -> AsType Word8
proxyToAsType Proxy Word8
_ = AsType Word8
AsWord8
instance HasTypeProxy Word16 where
data AsType Word16 = AsWord16
proxyToAsType :: Proxy Word16 -> AsType Word16
proxyToAsType Proxy Word16
_ = AsType Word16
AsWord16
instance HasTypeProxy BS.ByteString where
data AsType BS.ByteString = AsByteString
proxyToAsType :: Proxy ByteString -> AsType ByteString
proxyToAsType Proxy ByteString
_ = AsType ByteString
AsByteString
data FromSomeType (c :: Type -> Constraint) b where
FromSomeType :: c a => AsType a -> (a -> b) -> FromSomeType c b
asType :: HasTypeProxy t => AsType t
asType :: forall t. HasTypeProxy t => AsType t
asType = Proxy t -> AsType t
forall t. HasTypeProxy t => Proxy t -> AsType t
proxyToAsType Proxy t
forall {k} (t :: k). Proxy t
Proxy