module Data.X509.Internal
( module Data.ASN1.Parse
, asn1Container
, OID
, ErrT
, runErrT
) where
import Data.ASN1.Types
import Data.ASN1.Parse
import Control.Monad.Trans.Except
runErrT :: ExceptT e m a -> m (Either e a)
runErrT :: forall e (m :: * -> *) a. ExceptT e m a -> m (Either e a)
runErrT = forall e (m :: * -> *) a. ExceptT e m a -> m (Either e a)
runExceptT
type ErrT = ExceptT
asn1Container :: ASN1ConstructionType -> [ASN1] -> [ASN1]
asn1Container :: ASN1ConstructionType -> [ASN1] -> [ASN1]
asn1Container ASN1ConstructionType
ty [ASN1]
l = [ASN1ConstructionType -> ASN1
Start ASN1ConstructionType
ty] forall a. [a] -> [a] -> [a]
++ [ASN1]
l forall a. [a] -> [a] -> [a]
++ [ASN1ConstructionType -> ASN1
End ASN1ConstructionType
ty]