{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE UndecidableInstances #-}
module Crypto.Store.PKCS12
( IntegrityParams
, readP12File
, readP12FileFromMemory
, writeP12File
, writeP12FileToMemory
, writeUnprotectedP12File
, writeUnprotectedP12FileToMemory
, PKCS12
, unPKCS12
, unPKCS12'
, unencrypted
, encrypted
, SafeContents(..)
, SafeBag
, Bag(..)
, SafeInfo(..)
, CertInfo(..)
, CRLInfo(..)
, Attribute(..)
, getSafeKeys
, getAllSafeKeys
, getSafeX509Certs
, getAllSafeX509Certs
, getSafeX509CRLs
, getAllSafeX509CRLs
, findAttribute
, setAttribute
, filterAttributes
, getFriendlyName
, setFriendlyName
, getLocalKeyId
, setLocalKeyId
, fromCredential
, fromNamedCredential
, toCredential
, toNamedCredential
, Password
, OptAuthenticated(..)
, recoverAuthenticated
, ProtectionPassword
, emptyNotTerminated
, fromProtectionPassword
, toProtectionPassword
, OptProtected(..)
, recover
, recoverA
) where
import Control.Monad
import Data.ASN1.Types
import qualified Data.ByteArray as B
import qualified Data.ByteString as BS
import Data.List (partition)
import Data.Maybe (fromMaybe, mapMaybe)
import Data.Semigroup
import qualified Data.X509 as X509
import qualified Data.X509.Validation as X509
import Crypto.Cipher.Types
import Crypto.Store.ASN1.Generate
import Crypto.Store.ASN1.Parse
import Crypto.Store.CMS
import Crypto.Store.CMS.Algorithms
import Crypto.Store.CMS.Attribute
import Crypto.Store.CMS.Encrypted
import Crypto.Store.CMS.Enveloped
import Crypto.Store.CMS.Util
import Crypto.Store.Error
import Crypto.Store.PKCS5
import Crypto.Store.PKCS5.PBES1
import Crypto.Store.PKCS8
data OptAuthenticated a = Unauthenticated a
| Authenticated (Password -> Either StoreError (ProtectionPassword, a))
instance Functor OptAuthenticated where
fmap :: forall a b. (a -> b) -> OptAuthenticated a -> OptAuthenticated b
fmap a -> b
f (Unauthenticated a
x) = b -> OptAuthenticated b
forall a. a -> OptAuthenticated a
Unauthenticated (a -> b
f a
x)
fmap a -> b
f (Authenticated ByteString -> Either StoreError (ProtectionPassword, a)
g) = (ByteString -> Either StoreError (ProtectionPassword, b))
-> OptAuthenticated b
forall a.
(ByteString -> Either StoreError (ProtectionPassword, a))
-> OptAuthenticated a
Authenticated (((ProtectionPassword, a) -> (ProtectionPassword, b))
-> Either StoreError (ProtectionPassword, a)
-> Either StoreError (ProtectionPassword, b)
forall a b. (a -> b) -> Either StoreError a -> Either StoreError b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ((a -> b) -> (ProtectionPassword, a) -> (ProtectionPassword, b)
forall a b.
(a -> b) -> (ProtectionPassword, a) -> (ProtectionPassword, b)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap a -> b
f) (Either StoreError (ProtectionPassword, a)
-> Either StoreError (ProtectionPassword, b))
-> (ByteString -> Either StoreError (ProtectionPassword, a))
-> ByteString
-> Either StoreError (ProtectionPassword, b)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> Either StoreError (ProtectionPassword, a)
g)
recoverAuthenticated :: Password -> OptAuthenticated a -> Either StoreError (ProtectionPassword, a)
recoverAuthenticated :: forall a.
ByteString
-> OptAuthenticated a -> Either StoreError (ProtectionPassword, a)
recoverAuthenticated ByteString
pwd (Unauthenticated a
x) = (ProtectionPassword, a)
-> Either StoreError (ProtectionPassword, a)
forall a b. b -> Either a b
Right (ByteString -> ProtectionPassword
toProtectionPassword ByteString
pwd, a
x)
recoverAuthenticated ByteString
pwd (Authenticated ByteString -> Either StoreError (ProtectionPassword, a)
f) = ByteString -> Either StoreError (ProtectionPassword, a)
f ByteString
pwd
readP12File :: FilePath -> IO (Either StoreError (OptAuthenticated PKCS12))
readP12File :: String -> IO (Either StoreError (OptAuthenticated PKCS12))
readP12File String
path = ByteString -> Either StoreError (OptAuthenticated PKCS12)
readP12FileFromMemory (ByteString -> Either StoreError (OptAuthenticated PKCS12))
-> IO ByteString
-> IO (Either StoreError (OptAuthenticated PKCS12))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> IO ByteString
BS.readFile String
path
readP12FileFromMemory :: BS.ByteString -> Either StoreError (OptAuthenticated PKCS12)
readP12FileFromMemory :: ByteString -> Either StoreError (OptAuthenticated PKCS12)
readP12FileFromMemory ByteString
ber = ByteString -> Either StoreError PFX
forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decode ByteString
ber Either StoreError PFX
-> (PFX -> Either StoreError (OptAuthenticated PKCS12))
-> Either StoreError (OptAuthenticated PKCS12)
forall a b.
Either StoreError a
-> (a -> Either StoreError b) -> Either StoreError b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= PFX -> Either StoreError (OptAuthenticated PKCS12)
forall {a}.
ParseASN1Object [ASN1Event] a =>
PFX -> Either StoreError (OptAuthenticated a)
integrity
where
integrity :: PFX -> Either StoreError (OptAuthenticated a)
integrity PFX{Maybe MacData
ByteString
authSafeData :: ByteString
macData :: Maybe MacData
authSafeData :: PFX -> ByteString
macData :: PFX -> Maybe MacData
..} =
case Maybe MacData
macData of
Maybe MacData
Nothing -> a -> OptAuthenticated a
forall a. a -> OptAuthenticated a
Unauthenticated (a -> OptAuthenticated a)
-> Either StoreError a -> Either StoreError (OptAuthenticated a)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ByteString -> Either StoreError a
forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decode ByteString
authSafeData
Just MacData
md -> OptAuthenticated a -> Either StoreError (OptAuthenticated a)
forall a. a -> Either StoreError a
forall (m :: * -> *) a. Monad m => a -> m a
return (OptAuthenticated a -> Either StoreError (OptAuthenticated a))
-> OptAuthenticated a -> Either StoreError (OptAuthenticated a)
forall a b. (a -> b) -> a -> b
$ (ByteString -> Either StoreError (ProtectionPassword, a))
-> OptAuthenticated a
forall a.
(ByteString -> Either StoreError (ProtectionPassword, a))
-> OptAuthenticated a
Authenticated (MacData
-> ByteString
-> ByteString
-> Either StoreError (ProtectionPassword, a)
forall {a}.
ParseASN1Object [ASN1Event] a =>
MacData
-> ByteString
-> ByteString
-> Either StoreError (ProtectionPassword, a)
verify MacData
md ByteString
authSafeData)
verify :: MacData
-> ByteString
-> ByteString
-> Either StoreError (ProtectionPassword, a)
verify MacData{MessageAuthenticationCode
DigestAlgorithm
PBEParameter
digAlg :: DigestAlgorithm
macValue :: MessageAuthenticationCode
macParams :: PBEParameter
digAlg :: MacData -> DigestAlgorithm
macValue :: MacData -> MessageAuthenticationCode
macParams :: MacData -> PBEParameter
..} ByteString
content ByteString
pwdUTF8 =
case DigestAlgorithm
digAlg of
DigestAlgorithm DigestProxy hashAlg
d -> [ProtectionPassword] -> Either StoreError (ProtectionPassword, a)
loop (ByteString -> [ProtectionPassword]
toProtectionPasswords ByteString
pwdUTF8)
where
loop :: [ProtectionPassword] -> Either StoreError (ProtectionPassword, a)
loop [] = StoreError -> Either StoreError (ProtectionPassword, a)
forall a b. a -> Either a b
Left StoreError
BadContentMAC
loop (ProtectionPassword
pwd:[ProtectionPassword]
others) =
let fn :: Key
-> MACAlgorithm
-> ByteString
-> Either StoreError (ProtectionPassword, a)
fn Key
key MACAlgorithm
macAlg ByteString
bs
| Bool -> Bool
not (MACAlgorithm -> Bool
forall params. HasStrength params => params -> Bool
securityAcceptable MACAlgorithm
macAlg) =
StoreError -> Either StoreError (ProtectionPassword, a)
forall a b. a -> Either a b
Left (String -> StoreError
InvalidParameter String
"Integrity MAC too weak")
| MessageAuthenticationCode
macValue MessageAuthenticationCode -> MessageAuthenticationCode -> Bool
forall a. Eq a => a -> a -> Bool
== MACAlgorithm -> Key -> ByteString -> MessageAuthenticationCode
forall key message.
(ByteArrayAccess key, ByteArrayAccess message) =>
MACAlgorithm -> key -> message -> MessageAuthenticationCode
mac MACAlgorithm
macAlg Key
key ByteString
bs = (ProtectionPassword
pwd,) (a -> (ProtectionPassword, a))
-> Either StoreError a -> Either StoreError (ProtectionPassword, a)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ByteString -> Either StoreError a
forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decode ByteString
bs
| Bool
otherwise = [ProtectionPassword] -> Either StoreError (ProtectionPassword, a)
loop [ProtectionPassword]
others
in (StoreError -> Either StoreError (ProtectionPassword, a))
-> (Key
-> MACAlgorithm
-> ByteString
-> Either StoreError (ProtectionPassword, a))
-> DigestProxy hashAlg
-> PBEParameter
-> ByteString
-> ProtectionPassword
-> Either StoreError (ProtectionPassword, a)
forall hash result.
HashAlgorithm hash =>
(StoreError -> result)
-> (Key -> MACAlgorithm -> ByteString -> result)
-> DigestProxy hash
-> PBEParameter
-> ByteString
-> ProtectionPassword
-> result
pkcs12mac StoreError -> Either StoreError (ProtectionPassword, a)
forall a b. a -> Either a b
Left Key
-> MACAlgorithm
-> ByteString
-> Either StoreError (ProtectionPassword, a)
fn DigestProxy hashAlg
d PBEParameter
macParams ByteString
content ProtectionPassword
pwd
type IntegrityParams = (DigestAlgorithm, PBEParameter)
writeP12File :: FilePath
-> IntegrityParams -> ProtectionPassword
-> PKCS12
-> IO (Either StoreError ())
writeP12File :: String
-> IntegrityParams
-> ProtectionPassword
-> PKCS12
-> IO (Either StoreError ())
writeP12File String
path IntegrityParams
intp ProtectionPassword
pw PKCS12
aSafe =
case IntegrityParams
-> ProtectionPassword -> PKCS12 -> Either StoreError ByteString
writeP12FileToMemory IntegrityParams
intp ProtectionPassword
pw PKCS12
aSafe of
Left StoreError
e -> Either StoreError () -> IO (Either StoreError ())
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (StoreError -> Either StoreError ()
forall a b. a -> Either a b
Left StoreError
e)
Right ByteString
bs -> () -> Either StoreError ()
forall a b. b -> Either a b
Right (() -> Either StoreError ()) -> IO () -> IO (Either StoreError ())
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> ByteString -> IO ()
BS.writeFile String
path ByteString
bs
writeP12FileToMemory :: IntegrityParams -> ProtectionPassword
-> PKCS12
-> Either StoreError BS.ByteString
writeP12FileToMemory :: IntegrityParams
-> ProtectionPassword -> PKCS12 -> Either StoreError ByteString
writeP12FileToMemory (alg :: DigestAlgorithm
alg@(DigestAlgorithm DigestProxy hashAlg
hashAlg), PBEParameter
pbeParam) ProtectionPassword
pwdUTF8 PKCS12
aSafe =
MacData -> ByteString
encode (MacData -> ByteString)
-> Either StoreError MacData -> Either StoreError ByteString
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Either StoreError MacData
protect
where
content :: ByteString
content = PKCS12 -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object PKCS12
aSafe
encode :: MacData -> ByteString
encode MacData
md = PFX -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object PFX { authSafeData :: ByteString
authSafeData = ByteString
content, macData :: Maybe MacData
macData = MacData -> Maybe MacData
forall a. a -> Maybe a
Just MacData
md }
protect :: Either StoreError MacData
protect = (StoreError -> Either StoreError MacData)
-> (Key -> MACAlgorithm -> ByteString -> Either StoreError MacData)
-> DigestProxy hashAlg
-> PBEParameter
-> ByteString
-> ProtectionPassword
-> Either StoreError MacData
forall hash result.
HashAlgorithm hash =>
(StoreError -> result)
-> (Key -> MACAlgorithm -> ByteString -> result)
-> DigestProxy hash
-> PBEParameter
-> ByteString
-> ProtectionPassword
-> result
pkcs12mac StoreError -> Either StoreError MacData
forall a b. a -> Either a b
Left Key -> MACAlgorithm -> ByteString -> Either StoreError MacData
fn DigestProxy hashAlg
hashAlg PBEParameter
pbeParam ByteString
content ProtectionPassword
pwdUTF8
fn :: Key -> MACAlgorithm -> ByteString -> Either StoreError MacData
fn Key
key MACAlgorithm
macAlg ByteString
bs = MacData -> Either StoreError MacData
forall a b. b -> Either a b
Right MacData { digAlg :: DigestAlgorithm
digAlg = DigestAlgorithm
alg
, macValue :: MessageAuthenticationCode
macValue = MACAlgorithm -> Key -> ByteString -> MessageAuthenticationCode
forall key message.
(ByteArrayAccess key, ByteArrayAccess message) =>
MACAlgorithm -> key -> message -> MessageAuthenticationCode
mac MACAlgorithm
macAlg Key
key ByteString
bs
, macParams :: PBEParameter
macParams = PBEParameter
pbeParam
}
writeUnprotectedP12File :: FilePath -> PKCS12 -> IO ()
writeUnprotectedP12File :: String -> PKCS12 -> IO ()
writeUnprotectedP12File String
path = String -> ByteString -> IO ()
BS.writeFile String
path (ByteString -> IO ()) -> (PKCS12 -> ByteString) -> PKCS12 -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PKCS12 -> ByteString
writeUnprotectedP12FileToMemory
writeUnprotectedP12FileToMemory :: PKCS12 -> BS.ByteString
writeUnprotectedP12FileToMemory :: PKCS12 -> ByteString
writeUnprotectedP12FileToMemory PKCS12
aSafe = PFX -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object PFX
pfx
where
content :: ByteString
content = PKCS12 -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object PKCS12
aSafe
pfx :: PFX
pfx = PFX { authSafeData :: ByteString
authSafeData = ByteString
content, macData :: Maybe MacData
macData = Maybe MacData
forall a. Maybe a
Nothing }
data PFX = PFX
{ PFX -> ByteString
authSafeData :: BS.ByteString
, PFX -> Maybe MacData
macData :: Maybe MacData
}
deriving (Int -> PFX -> ShowS
[PFX] -> ShowS
PFX -> String
(Int -> PFX -> ShowS)
-> (PFX -> String) -> ([PFX] -> ShowS) -> Show PFX
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PFX -> ShowS
showsPrec :: Int -> PFX -> ShowS
$cshow :: PFX -> String
show :: PFX -> String
$cshowList :: [PFX] -> ShowS
showList :: [PFX] -> ShowS
Show,PFX -> PFX -> Bool
(PFX -> PFX -> Bool) -> (PFX -> PFX -> Bool) -> Eq PFX
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PFX -> PFX -> Bool
== :: PFX -> PFX -> Bool
$c/= :: PFX -> PFX -> Bool
/= :: PFX -> PFX -> Bool
Eq)
instance ProduceASN1Object ASN1P PFX where
asn1s :: PFX -> ASN1Stream ASN1P
asn1s PFX{Maybe MacData
ByteString
authSafeData :: PFX -> ByteString
macData :: PFX -> Maybe MacData
authSafeData :: ByteString
macData :: Maybe MacData
..} =
ASN1ConstructionType -> ASN1Stream ASN1P -> ASN1Stream ASN1P
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence (ASN1Stream ASN1P
v ASN1Stream ASN1P -> ASN1Stream ASN1P -> ASN1Stream ASN1P
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream ASN1P
a ASN1Stream ASN1P -> ASN1Stream ASN1P -> ASN1Stream ASN1P
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream ASN1P
m)
where
v :: ASN1Stream ASN1P
v = Integer -> ASN1Stream ASN1P
forall e. ASN1Elem e => Integer -> ASN1Stream e
gIntVal Integer
3
a :: ASN1Stream ASN1P
a = ContentInfo -> ASN1Stream ASN1P
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s (ByteString -> ContentInfo
DataCI ByteString
authSafeData)
m :: ASN1Stream ASN1P
m = Maybe MacData -> (MacData -> ASN1Stream ASN1P) -> ASN1Stream ASN1P
forall a e. Maybe a -> (a -> ASN1Stream e) -> ASN1Stream e
optASN1S Maybe MacData
macData MacData -> ASN1Stream ASN1P
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s
instance ParseASN1Object [ASN1Event] PFX where
parse :: ParseASN1 [ASN1Event] PFX
parse = ASN1ConstructionType
-> ParseASN1 [ASN1Event] PFX -> ParseASN1 [ASN1Event] PFX
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence (ParseASN1 [ASN1Event] PFX -> ParseASN1 [ASN1Event] PFX)
-> ParseASN1 [ASN1Event] PFX -> ParseASN1 [ASN1Event] PFX
forall a b. (a -> b) -> a -> b
$ do
IntVal Integer
v <- ParseASN1 [ASN1Event] ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
Bool -> ParseASN1 [ASN1Event] () -> ParseASN1 [ASN1Event] ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Integer
v Integer -> Integer -> Bool
forall a. Eq a => a -> a -> Bool
/= Integer
3) (ParseASN1 [ASN1Event] () -> ParseASN1 [ASN1Event] ())
-> ParseASN1 [ASN1Event] () -> ParseASN1 [ASN1Event] ()
forall a b. (a -> b) -> a -> b
$
String -> ParseASN1 [ASN1Event] ()
forall e a. String -> ParseASN1 e a
throwParseError (String
"PFX: parsed invalid version: " String -> ShowS
forall a. [a] -> [a] -> [a]
++ Integer -> String
forall a. Show a => a -> String
show Integer
v)
ContentInfo
ci <- ParseASN1 [ASN1Event] ContentInfo
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
ByteString
d <- case ContentInfo
ci of
DataCI ByteString
bs -> ByteString -> ParseASN1 [ASN1Event] ByteString
forall a. a -> ParseASN1 [ASN1Event] a
forall (m :: * -> *) a. Monad m => a -> m a
return ByteString
bs
SignedDataCI SignedData (Encap ByteString)
_ -> String -> ParseASN1 [ASN1Event] ByteString
forall e a. String -> ParseASN1 e a
throwParseError String
"PFX: public-key integrity mode is not supported"
ContentInfo
_ -> String -> ParseASN1 [ASN1Event] ByteString
forall e a. String -> ParseASN1 e a
throwParseError (String -> ParseASN1 [ASN1Event] ByteString)
-> String -> ParseASN1 [ASN1Event] ByteString
forall a b. (a -> b) -> a -> b
$ String
"PFX: invalid content type: " String -> ShowS
forall a. [a] -> [a] -> [a]
++ ContentType -> String
forall a. Show a => a -> String
show (ContentInfo -> ContentType
getContentType ContentInfo
ci)
Bool
b <- ParseASN1 [ASN1Event] Bool
forall e. ParseASN1 e Bool
hasNext
Maybe MacData
m <- if Bool
b then MacData -> Maybe MacData
forall a. a -> Maybe a
Just (MacData -> Maybe MacData)
-> ParseASN1 [ASN1Event] MacData
-> ParseASN1 [ASN1Event] (Maybe MacData)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 [ASN1Event] MacData
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse else Maybe MacData -> ParseASN1 [ASN1Event] (Maybe MacData)
forall a. a -> ParseASN1 [ASN1Event] a
forall (f :: * -> *) a. Applicative f => a -> f a
pure Maybe MacData
forall a. Maybe a
Nothing
PFX -> ParseASN1 [ASN1Event] PFX
forall a. a -> ParseASN1 [ASN1Event] a
forall (m :: * -> *) a. Monad m => a -> m a
return PFX { authSafeData :: ByteString
authSafeData = ByteString
d, macData :: Maybe MacData
macData = Maybe MacData
m }
data MacData = MacData
{ MacData -> DigestAlgorithm
digAlg :: DigestAlgorithm
, MacData -> MessageAuthenticationCode
macValue :: MessageAuthenticationCode
, MacData -> PBEParameter
macParams :: PBEParameter
}
deriving (Int -> MacData -> ShowS
[MacData] -> ShowS
MacData -> String
(Int -> MacData -> ShowS)
-> (MacData -> String) -> ([MacData] -> ShowS) -> Show MacData
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MacData -> ShowS
showsPrec :: Int -> MacData -> ShowS
$cshow :: MacData -> String
show :: MacData -> String
$cshowList :: [MacData] -> ShowS
showList :: [MacData] -> ShowS
Show,MacData -> MacData -> Bool
(MacData -> MacData -> Bool)
-> (MacData -> MacData -> Bool) -> Eq MacData
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MacData -> MacData -> Bool
== :: MacData -> MacData -> Bool
$c/= :: MacData -> MacData -> Bool
/= :: MacData -> MacData -> Bool
Eq)
instance ASN1Elem e => ProduceASN1Object e MacData where
asn1s :: MacData -> ASN1Stream e
asn1s MacData{MessageAuthenticationCode
DigestAlgorithm
PBEParameter
digAlg :: MacData -> DigestAlgorithm
macValue :: MacData -> MessageAuthenticationCode
macParams :: MacData -> PBEParameter
digAlg :: DigestAlgorithm
macValue :: MessageAuthenticationCode
macParams :: PBEParameter
..} =
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence (ASN1Stream e
m ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
s ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
i)
where
m :: ASN1Stream e
m = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence (ASN1Stream e
a ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
v)
a :: ASN1Stream e
a = ASN1ConstructionType -> DigestAlgorithm -> ASN1Stream e
forall e param.
(ASN1Elem e, AlgorithmId param, OIDable (AlgorithmType param)) =>
ASN1ConstructionType -> param -> ASN1Stream e
algorithmASN1S ASN1ConstructionType
Sequence DigestAlgorithm
digAlg
v :: ASN1Stream e
v = ByteString -> ASN1Stream e
forall e. ASN1Elem e => ByteString -> ASN1Stream e
gOctetString (MessageAuthenticationCode -> ByteString
forall bin bout.
(ByteArrayAccess bin, ByteArray bout) =>
bin -> bout
B.convert MessageAuthenticationCode
macValue)
s :: ASN1Stream e
s = ByteString -> ASN1Stream e
forall e. ASN1Elem e => ByteString -> ASN1Stream e
gOctetString (PBEParameter -> ByteString
pbeSalt PBEParameter
macParams)
i :: ASN1Stream e
i = Integer -> ASN1Stream e
forall e. ASN1Elem e => Integer -> ASN1Stream e
gIntVal (Int -> Integer
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int -> Integer) -> Int -> Integer
forall a b. (a -> b) -> a -> b
$ PBEParameter -> Int
pbeIterationCount PBEParameter
macParams)
instance Monoid e => ParseASN1Object e MacData where
parse :: ParseASN1 e MacData
parse = ASN1ConstructionType -> ParseASN1 e MacData -> ParseASN1 e MacData
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence (ParseASN1 e MacData -> ParseASN1 e MacData)
-> ParseASN1 e MacData -> ParseASN1 e MacData
forall a b. (a -> b) -> a -> b
$ do
(DigestAlgorithm
a, ByteString
v) <- ASN1ConstructionType
-> ParseASN1 e (DigestAlgorithm, ByteString)
-> ParseASN1 e (DigestAlgorithm, ByteString)
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence (ParseASN1 e (DigestAlgorithm, ByteString)
-> ParseASN1 e (DigestAlgorithm, ByteString))
-> ParseASN1 e (DigestAlgorithm, ByteString)
-> ParseASN1 e (DigestAlgorithm, ByteString)
forall a b. (a -> b) -> a -> b
$ do
DigestAlgorithm
a <- ASN1ConstructionType -> ParseASN1 e DigestAlgorithm
forall e param.
(Monoid e, AlgorithmId param, OIDNameable (AlgorithmType param)) =>
ASN1ConstructionType -> ParseASN1 e param
parseAlgorithm ASN1ConstructionType
Sequence
OctetString ByteString
v <- ParseASN1 e ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
(DigestAlgorithm, ByteString)
-> ParseASN1 e (DigestAlgorithm, ByteString)
forall a. a -> ParseASN1 e a
forall (m :: * -> *) a. Monad m => a -> m a
return (DigestAlgorithm
a, ByteString
v)
OctetString ByteString
s <- ParseASN1 e ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
Bool
b <- ParseASN1 e Bool
forall e. ParseASN1 e Bool
hasNext
IntVal Integer
i <- if Bool
b then ParseASN1 e ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext else ASN1 -> ParseASN1 e ASN1
forall a. a -> ParseASN1 e a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Integer -> ASN1
IntVal Integer
1)
MacData -> ParseASN1 e MacData
forall a. a -> ParseASN1 e a
forall (m :: * -> *) a. Monad m => a -> m a
return MacData { digAlg :: DigestAlgorithm
digAlg = DigestAlgorithm
a
, macValue :: MessageAuthenticationCode
macValue = Bytes -> MessageAuthenticationCode
AuthTag (ByteString -> Bytes
forall bin bout.
(ByteArrayAccess bin, ByteArray bout) =>
bin -> bout
B.convert ByteString
v)
, macParams :: PBEParameter
macParams = ByteString -> Int -> PBEParameter
PBEParameter ByteString
s (Integer -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral Integer
i)
}
newtype PKCS12 = PKCS12 [ASElement]
deriving (Int -> PKCS12 -> ShowS
[PKCS12] -> ShowS
PKCS12 -> String
(Int -> PKCS12 -> ShowS)
-> (PKCS12 -> String) -> ([PKCS12] -> ShowS) -> Show PKCS12
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PKCS12 -> ShowS
showsPrec :: Int -> PKCS12 -> ShowS
$cshow :: PKCS12 -> String
show :: PKCS12 -> String
$cshowList :: [PKCS12] -> ShowS
showList :: [PKCS12] -> ShowS
Show,PKCS12 -> PKCS12 -> Bool
(PKCS12 -> PKCS12 -> Bool)
-> (PKCS12 -> PKCS12 -> Bool) -> Eq PKCS12
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PKCS12 -> PKCS12 -> Bool
== :: PKCS12 -> PKCS12 -> Bool
$c/= :: PKCS12 -> PKCS12 -> Bool
/= :: PKCS12 -> PKCS12 -> Bool
Eq)
instance Semigroup PKCS12 where
PKCS12 [ASElement]
a <> :: PKCS12 -> PKCS12 -> PKCS12
<> PKCS12 [ASElement]
b = [ASElement] -> PKCS12
PKCS12 ([ASElement]
a [ASElement] -> [ASElement] -> [ASElement]
forall a. [a] -> [a] -> [a]
++ [ASElement]
b)
instance ProduceASN1Object ASN1P PKCS12 where
asn1s :: PKCS12 -> ASN1Stream ASN1P
asn1s (PKCS12 [ASElement]
elems) = ASN1ConstructionType -> ASN1Stream ASN1P -> ASN1Stream ASN1P
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence ([ASElement] -> ASN1Stream ASN1P
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s [ASElement]
elems)
instance ParseASN1Object [ASN1Event] PKCS12 where
parse :: ParseASN1 [ASN1Event] PKCS12
parse = [ASElement] -> PKCS12
PKCS12 ([ASElement] -> PKCS12)
-> ParseASN1 [ASN1Event] [ASElement]
-> ParseASN1 [ASN1Event] PKCS12
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ASN1ConstructionType
-> ParseASN1 [ASN1Event] [ASElement]
-> ParseASN1 [ASN1Event] [ASElement]
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence ParseASN1 [ASN1Event] [ASElement]
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
unPKCS12 :: PKCS12 -> OptProtected [SafeContents]
unPKCS12 :: PKCS12 -> OptProtected [SafeContents]
unPKCS12 = [OptProtected SafeContents] -> OptProtected [SafeContents]
forall a. [OptProtected a] -> OptProtected [a]
applySamePassword ([OptProtected SafeContents] -> OptProtected [SafeContents])
-> (PKCS12 -> [OptProtected SafeContents])
-> PKCS12
-> OptProtected [SafeContents]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PKCS12 -> [OptProtected SafeContents]
unPKCS12'
unPKCS12' :: PKCS12 -> [OptProtected SafeContents]
unPKCS12' :: PKCS12 -> [OptProtected SafeContents]
unPKCS12' (PKCS12 [ASElement]
elems) = (ASElement -> OptProtected SafeContents)
-> [ASElement] -> [OptProtected SafeContents]
forall a b. (a -> b) -> [a] -> [b]
map ASElement -> OptProtected SafeContents
f [ASElement]
elems
where f :: ASElement -> OptProtected SafeContents
f (Unencrypted SafeContents
sc) = SafeContents -> OptProtected SafeContents
forall a. a -> OptProtected a
Unprotected SafeContents
sc
f (Encrypted PKCS5
e) = (ProtectionPassword -> Either StoreError SafeContents)
-> OptProtected SafeContents
forall a.
(ProtectionPassword -> Either StoreError a) -> OptProtected a
Protected (PKCS5 -> ProtectionPassword -> Either StoreError ByteString
decrypt PKCS5
e (ProtectionPassword -> Either StoreError ByteString)
-> (ByteString -> Either StoreError SafeContents)
-> ProtectionPassword
-> Either StoreError SafeContents
forall (m :: * -> *) a b c.
Monad m =>
(a -> m b) -> (b -> m c) -> a -> m c
>=> ByteString -> Either StoreError SafeContents
forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decode)
unencrypted :: SafeContents -> PKCS12
unencrypted :: SafeContents -> PKCS12
unencrypted = [ASElement] -> PKCS12
PKCS12 ([ASElement] -> PKCS12)
-> (SafeContents -> [ASElement]) -> SafeContents -> PKCS12
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ASElement -> [ASElement] -> [ASElement]
forall a. a -> [a] -> [a]
:[]) (ASElement -> [ASElement])
-> (SafeContents -> ASElement) -> SafeContents -> [ASElement]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SafeContents -> ASElement
Unencrypted
encrypted :: EncryptionScheme -> ProtectionPassword -> SafeContents -> Either StoreError PKCS12
encrypted :: EncryptionScheme
-> ProtectionPassword -> SafeContents -> Either StoreError PKCS12
encrypted EncryptionScheme
alg ProtectionPassword
pwd SafeContents
sc = [ASElement] -> PKCS12
PKCS12 ([ASElement] -> PKCS12)
-> (PKCS5 -> [ASElement]) -> PKCS5 -> PKCS12
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ASElement -> [ASElement] -> [ASElement]
forall a. a -> [a] -> [a]
:[]) (ASElement -> [ASElement])
-> (PKCS5 -> ASElement) -> PKCS5 -> [ASElement]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PKCS5 -> ASElement
Encrypted (PKCS5 -> PKCS12)
-> Either StoreError PKCS5 -> Either StoreError PKCS12
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> EncryptionScheme
-> ProtectionPassword -> ByteString -> Either StoreError PKCS5
encrypt EncryptionScheme
alg ProtectionPassword
pwd ByteString
bs
where bs :: ByteString
bs = SafeContents -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object SafeContents
sc
data ASElement = Unencrypted SafeContents
| Encrypted PKCS5
deriving (Int -> ASElement -> ShowS
[ASElement] -> ShowS
ASElement -> String
(Int -> ASElement -> ShowS)
-> (ASElement -> String)
-> ([ASElement] -> ShowS)
-> Show ASElement
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ASElement -> ShowS
showsPrec :: Int -> ASElement -> ShowS
$cshow :: ASElement -> String
show :: ASElement -> String
$cshowList :: [ASElement] -> ShowS
showList :: [ASElement] -> ShowS
Show,ASElement -> ASElement -> Bool
(ASElement -> ASElement -> Bool)
-> (ASElement -> ASElement -> Bool) -> Eq ASElement
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ASElement -> ASElement -> Bool
== :: ASElement -> ASElement -> Bool
$c/= :: ASElement -> ASElement -> Bool
/= :: ASElement -> ASElement -> Bool
Eq)
instance ASN1Elem e => ProduceASN1Object e ASElement where
asn1s :: ASElement -> ASN1Stream e
asn1s (Unencrypted SafeContents
sc) = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence (ASN1Stream e
oid ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
cont)
where
oid :: ASN1Stream e
oid = OID -> ASN1Stream e
forall e. ASN1Elem e => OID -> ASN1Stream e
gOID (ContentType -> OID
forall a. OIDable a => a -> OID
getObjectID ContentType
DataType)
cont :: ASN1Stream e
cont = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container (ASN1Class -> Int -> ASN1ConstructionType
Container ASN1Class
Context Int
0) (ByteString -> ASN1Stream e
forall e. ASN1Elem e => ByteString -> ASN1Stream e
gOctetString ByteString
bs)
bs :: ByteString
bs = SafeContents -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object SafeContents
sc
asn1s (Encrypted PKCS5{ByteString
EncryptionScheme
encryptionAlgorithm :: EncryptionScheme
encryptedData :: ByteString
encryptionAlgorithm :: PKCS5 -> EncryptionScheme
encryptedData :: PKCS5 -> ByteString
..}) = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence (ASN1Stream e
oid ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
cont)
where
oid :: ASN1Stream e
oid = OID -> ASN1Stream e
forall e. ASN1Elem e => OID -> ASN1Stream e
gOID (ContentType -> OID
forall a. OIDable a => a -> OID
getObjectID ContentType
EncryptedDataType)
cont :: ASN1Stream e
cont = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container (ASN1Class -> Int -> ASN1ConstructionType
Container ASN1Class
Context Int
0) ASN1Stream e
inner
inner :: ASN1Stream e
inner = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence (Integer -> ASN1Stream e
forall e. ASN1Elem e => Integer -> ASN1Stream e
gIntVal Integer
0 ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
eci)
eci :: ASN1Stream e
eci = (ContentType, EncryptionScheme, Encap ByteString) -> ASN1Stream e
forall e alg.
(ASN1Elem e, ProduceASN1Object e alg) =>
(ContentType, alg, Encap ByteString) -> ASN1Stream e
encryptedContentInfoASN1S
(ContentType
DataType, EncryptionScheme
encryptionAlgorithm, ByteString -> Encap ByteString
forall a. a -> Encap a
Attached ByteString
encryptedData)
instance Monoid e => ParseASN1Object e ASElement where
parse :: ParseASN1 e ASElement
parse = ASN1ConstructionType
-> ParseASN1 e ASElement -> ParseASN1 e ASElement
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence (ParseASN1 e ASElement -> ParseASN1 e ASElement)
-> ParseASN1 e ASElement -> ParseASN1 e ASElement
forall a b. (a -> b) -> a -> b
$ do
OID OID
oid <- ParseASN1 e ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
String
-> OID
-> (ContentType -> ParseASN1 e ASElement)
-> ParseASN1 e ASElement
forall a e b.
OIDNameable a =>
String -> OID -> (a -> ParseASN1 e b) -> ParseASN1 e b
withObjectID String
"content type" OID
oid ((ContentType -> ParseASN1 e ASElement) -> ParseASN1 e ASElement)
-> (ContentType -> ParseASN1 e ASElement) -> ParseASN1 e ASElement
forall a b. (a -> b) -> a -> b
$ \ContentType
ct ->
ASN1ConstructionType
-> ParseASN1 e ASElement -> ParseASN1 e ASElement
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer (ASN1Class -> Int -> ASN1ConstructionType
Container ASN1Class
Context Int
0) (ContentType -> ParseASN1 e ASElement
parseInner ContentType
ct)
where
parseInner :: ContentType -> ParseASN1 e ASElement
parseInner ContentType
DataType = SafeContents -> ASElement
Unencrypted (SafeContents -> ASElement)
-> ParseASN1 e SafeContents -> ParseASN1 e ASElement
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e SafeContents
parseUnencrypted
parseInner ContentType
EncryptedDataType = PKCS5 -> ASElement
Encrypted (PKCS5 -> ASElement) -> ParseASN1 e PKCS5 -> ParseASN1 e ASElement
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e PKCS5
parseEncrypted
parseInner ContentType
EnvelopedDataType = String -> ParseASN1 e ASElement
forall e a. String -> ParseASN1 e a
throwParseError String
"PKCS12: public-key privacy mode is not supported"
parseInner ContentType
ct = String -> ParseASN1 e ASElement
forall e a. String -> ParseASN1 e a
throwParseError (String -> ParseASN1 e ASElement)
-> String -> ParseASN1 e ASElement
forall a b. (a -> b) -> a -> b
$ String
"PKCS12: invalid content type: " String -> ShowS
forall a. [a] -> [a] -> [a]
++ ContentType -> String
forall a. Show a => a -> String
show ContentType
ct
parseUnencrypted :: ParseASN1 e SafeContents
parseUnencrypted = String -> ParseASN1 e SafeContents
forall e obj.
(Monoid e, ParseASN1Object [ASN1Event] obj) =>
String -> ParseASN1 e obj
parseOctetStringObject String
"PKCS12"
parseEncrypted :: ParseASN1 e PKCS5
parseEncrypted = ASN1ConstructionType -> ParseASN1 e PKCS5 -> ParseASN1 e PKCS5
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence (ParseASN1 e PKCS5 -> ParseASN1 e PKCS5)
-> ParseASN1 e PKCS5 -> ParseASN1 e PKCS5
forall a b. (a -> b) -> a -> b
$ do
IntVal Integer
0 <- ParseASN1 e ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
(ContentType
DataType, EncryptionScheme
eScheme, Attached ByteString
ed) <- ParseASN1 e (ContentType, EncryptionScheme, Encap ByteString)
forall e alg.
ParseASN1Object e alg =>
ParseASN1 e (ContentType, alg, Encap ByteString)
parseEncryptedContentInfo
PKCS5 -> ParseASN1 e PKCS5
forall a. a -> ParseASN1 e a
forall (m :: * -> *) a. Monad m => a -> m a
return PKCS5 { encryptionAlgorithm :: EncryptionScheme
encryptionAlgorithm = EncryptionScheme
eScheme, encryptedData :: ByteString
encryptedData = ByteString
ed }
data Bag info = Bag
{ forall info. Bag info -> info
bagInfo :: info
, forall info. Bag info -> [Attribute]
bagAttributes :: [Attribute]
}
deriving (Int -> Bag info -> ShowS
[Bag info] -> ShowS
Bag info -> String
(Int -> Bag info -> ShowS)
-> (Bag info -> String) -> ([Bag info] -> ShowS) -> Show (Bag info)
forall info. Show info => Int -> Bag info -> ShowS
forall info. Show info => [Bag info] -> ShowS
forall info. Show info => Bag info -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: forall info. Show info => Int -> Bag info -> ShowS
showsPrec :: Int -> Bag info -> ShowS
$cshow :: forall info. Show info => Bag info -> String
show :: Bag info -> String
$cshowList :: forall info. Show info => [Bag info] -> ShowS
showList :: [Bag info] -> ShowS
Show,Bag info -> Bag info -> Bool
(Bag info -> Bag info -> Bool)
-> (Bag info -> Bag info -> Bool) -> Eq (Bag info)
forall info. Eq info => Bag info -> Bag info -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: forall info. Eq info => Bag info -> Bag info -> Bool
== :: Bag info -> Bag info -> Bool
$c/= :: forall info. Eq info => Bag info -> Bag info -> Bool
/= :: Bag info -> Bag info -> Bool
Eq)
class BagInfo info where
type BagType info
bagName :: info -> String
bagType :: info -> BagType info
valueASN1S :: ASN1Elem e => info -> ASN1Stream e
parseValue :: Monoid e => BagType info -> ParseASN1 e info
instance (ASN1Elem e, BagInfo info, OIDable (BagType info)) => ProduceASN1Object e (Bag info) where
asn1s :: Bag info -> ASN1Stream e
asn1s Bag{info
[Attribute]
bagInfo :: forall info. Bag info -> info
bagAttributes :: forall info. Bag info -> [Attribute]
bagInfo :: info
bagAttributes :: [Attribute]
..} = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence (ASN1Stream e
oid ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
val ASN1Stream e -> ASN1Stream e -> ASN1Stream e
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ASN1Stream e
att)
where
typ :: BagType info
typ = info -> BagType info
forall info. BagInfo info => info -> BagType info
bagType info
bagInfo
oid :: ASN1Stream e
oid = OID -> ASN1Stream e
forall e. ASN1Elem e => OID -> ASN1Stream e
gOID (BagType info -> OID
forall a. OIDable a => a -> OID
getObjectID BagType info
typ)
val :: ASN1Stream e
val = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container (ASN1Class -> Int -> ASN1ConstructionType
Container ASN1Class
Context Int
0) (info -> ASN1Stream e
forall e. ASN1Elem e => info -> ASN1Stream e
forall info e. (BagInfo info, ASN1Elem e) => info -> ASN1Stream e
valueASN1S info
bagInfo)
att :: ASN1Stream e
att | [Attribute] -> Bool
forall a. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [Attribute]
bagAttributes = ASN1Stream e
forall a. a -> a
id
| Bool
otherwise = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Set ([Attribute] -> ASN1Stream e
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s [Attribute]
bagAttributes)
instance (Monoid e, BagInfo info, OIDNameable (BagType info)) => ParseASN1Object e (Bag info) where
parse :: ParseASN1 e (Bag info)
parse = ASN1ConstructionType
-> ParseASN1 e (Bag info) -> ParseASN1 e (Bag info)
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence (ParseASN1 e (Bag info) -> ParseASN1 e (Bag info))
-> ParseASN1 e (Bag info) -> ParseASN1 e (Bag info)
forall a b. (a -> b) -> a -> b
$ do
OID OID
oid <- ParseASN1 e ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
info
val <- String
-> OID -> (BagType info -> ParseASN1 e info) -> ParseASN1 e info
forall a e b.
OIDNameable a =>
String -> OID -> (a -> ParseASN1 e b) -> ParseASN1 e b
withObjectID (info -> String
getName info
forall a. HasCallStack => a
undefined) OID
oid ((BagType info -> ParseASN1 e info) -> ParseASN1 e info)
-> (BagType info -> ParseASN1 e info) -> ParseASN1 e info
forall a b. (a -> b) -> a -> b
$
ASN1ConstructionType -> ParseASN1 e info -> ParseASN1 e info
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer (ASN1Class -> Int -> ASN1ConstructionType
Container ASN1Class
Context Int
0) (ParseASN1 e info -> ParseASN1 e info)
-> (BagType info -> ParseASN1 e info)
-> BagType info
-> ParseASN1 e info
forall b c a. (b -> c) -> (a -> b) -> a -> c
. BagType info -> ParseASN1 e info
forall e. Monoid e => BagType info -> ParseASN1 e info
forall info e.
(BagInfo info, Monoid e) =>
BagType info -> ParseASN1 e info
parseValue
[Attribute]
att <- [Attribute] -> Maybe [Attribute] -> [Attribute]
forall a. a -> Maybe a -> a
fromMaybe [] (Maybe [Attribute] -> [Attribute])
-> ParseASN1 e (Maybe [Attribute]) -> ParseASN1 e [Attribute]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ASN1ConstructionType
-> ParseASN1 e [Attribute] -> ParseASN1 e (Maybe [Attribute])
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e (Maybe a)
onNextContainerMaybe ASN1ConstructionType
Set ParseASN1 e [Attribute]
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
Bag info -> ParseASN1 e (Bag info)
forall a. a -> ParseASN1 e a
forall (m :: * -> *) a. Monad m => a -> m a
return Bag { bagInfo :: info
bagInfo = info
val, bagAttributes :: [Attribute]
bagAttributes = [Attribute]
att }
where
getName :: info -> String
getName :: info -> String
getName = info -> String
forall info. BagInfo info => info -> String
bagName
data CertType = TypeCertX509 deriving (Int -> CertType -> ShowS
[CertType] -> ShowS
CertType -> String
(Int -> CertType -> ShowS)
-> (CertType -> String) -> ([CertType] -> ShowS) -> Show CertType
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CertType -> ShowS
showsPrec :: Int -> CertType -> ShowS
$cshow :: CertType -> String
show :: CertType -> String
$cshowList :: [CertType] -> ShowS
showList :: [CertType] -> ShowS
Show,CertType -> CertType -> Bool
(CertType -> CertType -> Bool)
-> (CertType -> CertType -> Bool) -> Eq CertType
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CertType -> CertType -> Bool
== :: CertType -> CertType -> Bool
$c/= :: CertType -> CertType -> Bool
/= :: CertType -> CertType -> Bool
Eq)
instance Enumerable CertType where
values :: [CertType]
values = [ CertType
TypeCertX509 ]
instance OIDable CertType where
getObjectID :: CertType -> OID
getObjectID CertType
TypeCertX509 = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
9,Integer
22,Integer
1]
instance OIDNameable CertType where
fromObjectID :: OID -> Maybe CertType
fromObjectID OID
oid = OIDNameableWrapper CertType -> CertType
forall a. OIDNameableWrapper a -> a
unOIDNW (OIDNameableWrapper CertType -> CertType)
-> Maybe (OIDNameableWrapper CertType) -> Maybe CertType
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> OID -> Maybe (OIDNameableWrapper CertType)
forall a. OIDNameable a => OID -> Maybe a
fromObjectID OID
oid
newtype CertInfo = CertX509 X509.SignedCertificate deriving (Int -> CertInfo -> ShowS
[CertInfo] -> ShowS
CertInfo -> String
(Int -> CertInfo -> ShowS)
-> (CertInfo -> String) -> ([CertInfo] -> ShowS) -> Show CertInfo
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CertInfo -> ShowS
showsPrec :: Int -> CertInfo -> ShowS
$cshow :: CertInfo -> String
show :: CertInfo -> String
$cshowList :: [CertInfo] -> ShowS
showList :: [CertInfo] -> ShowS
Show,CertInfo -> CertInfo -> Bool
(CertInfo -> CertInfo -> Bool)
-> (CertInfo -> CertInfo -> Bool) -> Eq CertInfo
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CertInfo -> CertInfo -> Bool
== :: CertInfo -> CertInfo -> Bool
$c/= :: CertInfo -> CertInfo -> Bool
/= :: CertInfo -> CertInfo -> Bool
Eq)
instance BagInfo CertInfo where
type BagType CertInfo = CertType
bagName :: CertInfo -> String
bagName CertInfo
_ = String
"CertBag"
bagType :: CertInfo -> BagType CertInfo
bagType (CertX509 SignedCertificate
_) = CertType
BagType CertInfo
TypeCertX509
valueASN1S :: forall e. ASN1Elem e => CertInfo -> ASN1Stream e
valueASN1S (CertX509 SignedCertificate
c) = ByteString -> ASN1Stream e
forall e. ASN1Elem e => ByteString -> ASN1Stream e
gOctetString (SignedCertificate -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object SignedCertificate
c)
parseValue :: forall e. Monoid e => BagType CertInfo -> ParseASN1 e CertInfo
parseValue CertType
BagType CertInfo
TypeCertX509 = SignedCertificate -> CertInfo
CertX509 (SignedCertificate -> CertInfo)
-> ParseASN1 e SignedCertificate -> ParseASN1 e CertInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> ParseASN1 e SignedCertificate
forall e obj.
(Monoid e, ParseASN1Object [ASN1Event] obj) =>
String -> ParseASN1 e obj
parseOctetStringObject String
"CertBag"
data CRLType = TypeCRLX509 deriving (Int -> CRLType -> ShowS
[CRLType] -> ShowS
CRLType -> String
(Int -> CRLType -> ShowS)
-> (CRLType -> String) -> ([CRLType] -> ShowS) -> Show CRLType
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CRLType -> ShowS
showsPrec :: Int -> CRLType -> ShowS
$cshow :: CRLType -> String
show :: CRLType -> String
$cshowList :: [CRLType] -> ShowS
showList :: [CRLType] -> ShowS
Show,CRLType -> CRLType -> Bool
(CRLType -> CRLType -> Bool)
-> (CRLType -> CRLType -> Bool) -> Eq CRLType
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CRLType -> CRLType -> Bool
== :: CRLType -> CRLType -> Bool
$c/= :: CRLType -> CRLType -> Bool
/= :: CRLType -> CRLType -> Bool
Eq)
instance Enumerable CRLType where
values :: [CRLType]
values = [ CRLType
TypeCRLX509 ]
instance OIDable CRLType where
getObjectID :: CRLType -> OID
getObjectID CRLType
TypeCRLX509 = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
9,Integer
23,Integer
1]
instance OIDNameable CRLType where
fromObjectID :: OID -> Maybe CRLType
fromObjectID OID
oid = OIDNameableWrapper CRLType -> CRLType
forall a. OIDNameableWrapper a -> a
unOIDNW (OIDNameableWrapper CRLType -> CRLType)
-> Maybe (OIDNameableWrapper CRLType) -> Maybe CRLType
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> OID -> Maybe (OIDNameableWrapper CRLType)
forall a. OIDNameable a => OID -> Maybe a
fromObjectID OID
oid
newtype CRLInfo = CRLX509 X509.SignedCRL deriving (Int -> CRLInfo -> ShowS
[CRLInfo] -> ShowS
CRLInfo -> String
(Int -> CRLInfo -> ShowS)
-> (CRLInfo -> String) -> ([CRLInfo] -> ShowS) -> Show CRLInfo
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CRLInfo -> ShowS
showsPrec :: Int -> CRLInfo -> ShowS
$cshow :: CRLInfo -> String
show :: CRLInfo -> String
$cshowList :: [CRLInfo] -> ShowS
showList :: [CRLInfo] -> ShowS
Show,CRLInfo -> CRLInfo -> Bool
(CRLInfo -> CRLInfo -> Bool)
-> (CRLInfo -> CRLInfo -> Bool) -> Eq CRLInfo
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CRLInfo -> CRLInfo -> Bool
== :: CRLInfo -> CRLInfo -> Bool
$c/= :: CRLInfo -> CRLInfo -> Bool
/= :: CRLInfo -> CRLInfo -> Bool
Eq)
instance BagInfo CRLInfo where
type BagType CRLInfo = CRLType
bagName :: CRLInfo -> String
bagName CRLInfo
_ = String
"CRLBag"
bagType :: CRLInfo -> BagType CRLInfo
bagType (CRLX509 SignedCRL
_) = CRLType
BagType CRLInfo
TypeCRLX509
valueASN1S :: forall e. ASN1Elem e => CRLInfo -> ASN1Stream e
valueASN1S (CRLX509 SignedCRL
c) = ByteString -> ASN1Stream e
forall e. ASN1Elem e => ByteString -> ASN1Stream e
gOctetString (SignedCRL -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object SignedCRL
c)
parseValue :: forall e. Monoid e => BagType CRLInfo -> ParseASN1 e CRLInfo
parseValue CRLType
BagType CRLInfo
TypeCRLX509 = SignedCRL -> CRLInfo
CRLX509 (SignedCRL -> CRLInfo)
-> ParseASN1 e SignedCRL -> ParseASN1 e CRLInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> ParseASN1 e SignedCRL
forall e obj.
(Monoid e, ParseASN1Object [ASN1Event] obj) =>
String -> ParseASN1 e obj
parseOctetStringObject String
"CRLBag"
data SafeType = TypeKey
| TypePKCS8ShroudedKey
| TypeCert
| TypeCRL
| TypeSecret
| TypeSafeContents
deriving (Int -> SafeType -> ShowS
[SafeType] -> ShowS
SafeType -> String
(Int -> SafeType -> ShowS)
-> (SafeType -> String) -> ([SafeType] -> ShowS) -> Show SafeType
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SafeType -> ShowS
showsPrec :: Int -> SafeType -> ShowS
$cshow :: SafeType -> String
show :: SafeType -> String
$cshowList :: [SafeType] -> ShowS
showList :: [SafeType] -> ShowS
Show,SafeType -> SafeType -> Bool
(SafeType -> SafeType -> Bool)
-> (SafeType -> SafeType -> Bool) -> Eq SafeType
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SafeType -> SafeType -> Bool
== :: SafeType -> SafeType -> Bool
$c/= :: SafeType -> SafeType -> Bool
/= :: SafeType -> SafeType -> Bool
Eq)
instance Enumerable SafeType where
values :: [SafeType]
values = [ SafeType
TypeKey
, SafeType
TypePKCS8ShroudedKey
, SafeType
TypeCert
, SafeType
TypeCRL
, SafeType
TypeSecret
, SafeType
TypeSafeContents
]
instance OIDable SafeType where
getObjectID :: SafeType -> OID
getObjectID SafeType
TypeKey = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
12,Integer
10,Integer
1,Integer
1]
getObjectID SafeType
TypePKCS8ShroudedKey = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
12,Integer
10,Integer
1,Integer
2]
getObjectID SafeType
TypeCert = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
12,Integer
10,Integer
1,Integer
3]
getObjectID SafeType
TypeCRL = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
12,Integer
10,Integer
1,Integer
4]
getObjectID SafeType
TypeSecret = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
12,Integer
10,Integer
1,Integer
5]
getObjectID SafeType
TypeSafeContents = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
12,Integer
10,Integer
1,Integer
6]
instance OIDNameable SafeType where
fromObjectID :: OID -> Maybe SafeType
fromObjectID OID
oid = OIDNameableWrapper SafeType -> SafeType
forall a. OIDNameableWrapper a -> a
unOIDNW (OIDNameableWrapper SafeType -> SafeType)
-> Maybe (OIDNameableWrapper SafeType) -> Maybe SafeType
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> OID -> Maybe (OIDNameableWrapper SafeType)
forall a. OIDNameable a => OID -> Maybe a
fromObjectID OID
oid
data SafeInfo = KeyBag (FormattedKey X509.PrivKey)
| PKCS8ShroudedKeyBag PKCS5
| CertBag (Bag CertInfo)
| CRLBag (Bag CRLInfo)
| SecretBag [ASN1]
| SafeContentsBag SafeContents
deriving (Int -> SafeInfo -> ShowS
[SafeInfo] -> ShowS
SafeInfo -> String
(Int -> SafeInfo -> ShowS)
-> (SafeInfo -> String) -> ([SafeInfo] -> ShowS) -> Show SafeInfo
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SafeInfo -> ShowS
showsPrec :: Int -> SafeInfo -> ShowS
$cshow :: SafeInfo -> String
show :: SafeInfo -> String
$cshowList :: [SafeInfo] -> ShowS
showList :: [SafeInfo] -> ShowS
Show,SafeInfo -> SafeInfo -> Bool
(SafeInfo -> SafeInfo -> Bool)
-> (SafeInfo -> SafeInfo -> Bool) -> Eq SafeInfo
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SafeInfo -> SafeInfo -> Bool
== :: SafeInfo -> SafeInfo -> Bool
$c/= :: SafeInfo -> SafeInfo -> Bool
/= :: SafeInfo -> SafeInfo -> Bool
Eq)
instance BagInfo SafeInfo where
type BagType SafeInfo = SafeType
bagName :: SafeInfo -> String
bagName SafeInfo
_ = String
"SafeBag"
bagType :: SafeInfo -> BagType SafeInfo
bagType (KeyBag FormattedKey PrivKey
_) = SafeType
BagType SafeInfo
TypeKey
bagType (PKCS8ShroudedKeyBag PKCS5
_) = SafeType
BagType SafeInfo
TypePKCS8ShroudedKey
bagType (CertBag Bag CertInfo
_) = SafeType
BagType SafeInfo
TypeCert
bagType (CRLBag Bag CRLInfo
_) = SafeType
BagType SafeInfo
TypeCRL
bagType (SecretBag [ASN1]
_) = SafeType
BagType SafeInfo
TypeSecret
bagType (SafeContentsBag SafeContents
_) = SafeType
BagType SafeInfo
TypeSafeContents
valueASN1S :: forall e. ASN1Elem e => SafeInfo -> ASN1Stream e
valueASN1S (KeyBag FormattedKey PrivKey
k) = FormattedKey PrivKey -> ASN1Stream e
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s FormattedKey PrivKey
k
valueASN1S (PKCS8ShroudedKeyBag PKCS5
k) = PKCS5 -> ASN1Stream e
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s PKCS5
k
valueASN1S (CertBag Bag CertInfo
c) = Bag CertInfo -> ASN1Stream e
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s Bag CertInfo
c
valueASN1S (CRLBag Bag CRLInfo
c) = Bag CRLInfo -> ASN1Stream e
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s Bag CRLInfo
c
valueASN1S (SecretBag [ASN1]
s) = [ASN1] -> ASN1Stream e
forall e. ASN1Elem e => [ASN1] -> ASN1Stream e
gMany [ASN1]
s
valueASN1S (SafeContentsBag SafeContents
sc) = SafeContents -> ASN1Stream e
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s SafeContents
sc
parseValue :: forall e. Monoid e => BagType SafeInfo -> ParseASN1 e SafeInfo
parseValue SafeType
BagType SafeInfo
TypeKey = FormattedKey PrivKey -> SafeInfo
KeyBag (FormattedKey PrivKey -> SafeInfo)
-> ParseASN1 e (FormattedKey PrivKey) -> ParseASN1 e SafeInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e (FormattedKey PrivKey)
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
parseValue SafeType
BagType SafeInfo
TypePKCS8ShroudedKey = PKCS5 -> SafeInfo
PKCS8ShroudedKeyBag (PKCS5 -> SafeInfo) -> ParseASN1 e PKCS5 -> ParseASN1 e SafeInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e PKCS5
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
parseValue SafeType
BagType SafeInfo
TypeCert = Bag CertInfo -> SafeInfo
CertBag (Bag CertInfo -> SafeInfo)
-> ParseASN1 e (Bag CertInfo) -> ParseASN1 e SafeInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e (Bag CertInfo)
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
parseValue SafeType
BagType SafeInfo
TypeCRL = Bag CRLInfo -> SafeInfo
CRLBag (Bag CRLInfo -> SafeInfo)
-> ParseASN1 e (Bag CRLInfo) -> ParseASN1 e SafeInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e (Bag CRLInfo)
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
parseValue SafeType
BagType SafeInfo
TypeSecret = [ASN1] -> SafeInfo
SecretBag ([ASN1] -> SafeInfo) -> ParseASN1 e [ASN1] -> ParseASN1 e SafeInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e ASN1 -> ParseASN1 e [ASN1]
forall e a. ParseASN1 e a -> ParseASN1 e [a]
getMany ParseASN1 e ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
parseValue SafeType
BagType SafeInfo
TypeSafeContents = SafeContents -> SafeInfo
SafeContentsBag (SafeContents -> SafeInfo)
-> ParseASN1 e SafeContents -> ParseASN1 e SafeInfo
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ParseASN1 e SafeContents
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
type SafeBag = Bag SafeInfo
newtype SafeContents = SafeContents { SafeContents -> [SafeBag]
unSafeContents :: [SafeBag] }
deriving (Int -> SafeContents -> ShowS
[SafeContents] -> ShowS
SafeContents -> String
(Int -> SafeContents -> ShowS)
-> (SafeContents -> String)
-> ([SafeContents] -> ShowS)
-> Show SafeContents
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SafeContents -> ShowS
showsPrec :: Int -> SafeContents -> ShowS
$cshow :: SafeContents -> String
show :: SafeContents -> String
$cshowList :: [SafeContents] -> ShowS
showList :: [SafeContents] -> ShowS
Show,SafeContents -> SafeContents -> Bool
(SafeContents -> SafeContents -> Bool)
-> (SafeContents -> SafeContents -> Bool) -> Eq SafeContents
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SafeContents -> SafeContents -> Bool
== :: SafeContents -> SafeContents -> Bool
$c/= :: SafeContents -> SafeContents -> Bool
/= :: SafeContents -> SafeContents -> Bool
Eq)
instance ASN1Elem e => ProduceASN1Object e SafeContents where
asn1s :: SafeContents -> ASN1Stream e
asn1s (SafeContents [SafeBag]
s) = ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
forall e.
ASN1Elem e =>
ASN1ConstructionType -> ASN1Stream e -> ASN1Stream e
asn1Container ASN1ConstructionType
Sequence ([SafeBag] -> ASN1Stream e
forall e obj. ProduceASN1Object e obj => obj -> ASN1Stream e
asn1s [SafeBag]
s)
instance Monoid e => ParseASN1Object e SafeContents where
parse :: ParseASN1 e SafeContents
parse = [SafeBag] -> SafeContents
SafeContents ([SafeBag] -> SafeContents)
-> ParseASN1 e [SafeBag] -> ParseASN1 e SafeContents
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ASN1ConstructionType
-> ParseASN1 e [SafeBag] -> ParseASN1 e [SafeBag]
forall e a.
Monoid e =>
ASN1ConstructionType -> ParseASN1 e a -> ParseASN1 e a
onNextContainer ASN1ConstructionType
Sequence ParseASN1 e [SafeBag]
forall e obj. ParseASN1Object e obj => ParseASN1 e obj
parse
filterBags :: ([Attribute] -> Bool) -> SafeContents -> SafeContents
filterBags :: ([Attribute] -> Bool) -> SafeContents -> SafeContents
filterBags [Attribute] -> Bool
p (SafeContents [SafeBag]
scs) = [SafeBag] -> SafeContents
SafeContents ((SafeBag -> Maybe SafeBag) -> [SafeBag] -> [SafeBag]
forall a b. (a -> Maybe b) -> [a] -> [b]
mapMaybe SafeBag -> Maybe SafeBag
f [SafeBag]
scs)
where
f :: SafeBag -> Maybe SafeBag
f (Bag (SafeContentsBag SafeContents
inner) [Attribute]
attrs) =
SafeBag -> Maybe SafeBag
forall a. a -> Maybe a
Just (SafeInfo -> [Attribute] -> SafeBag
forall info. info -> [Attribute] -> Bag info
Bag (SafeContents -> SafeInfo
SafeContentsBag (SafeContents -> SafeInfo) -> SafeContents -> SafeInfo
forall a b. (a -> b) -> a -> b
$ ([Attribute] -> Bool) -> SafeContents -> SafeContents
filterBags [Attribute] -> Bool
p SafeContents
inner) [Attribute]
attrs)
f SafeBag
bag | [Attribute] -> Bool
p (SafeBag -> [Attribute]
forall info. Bag info -> [Attribute]
bagAttributes SafeBag
bag) = SafeBag -> Maybe SafeBag
forall a. a -> Maybe a
Just SafeBag
bag
| Bool
otherwise = Maybe SafeBag
forall a. Maybe a
Nothing
filterByFriendlyName :: String -> SafeContents -> SafeContents
filterByFriendlyName :: String -> SafeContents -> SafeContents
filterByFriendlyName String
name = ([Attribute] -> Bool) -> SafeContents -> SafeContents
filterBags ((Maybe String -> Maybe String -> Bool
forall a. Eq a => a -> a -> Bool
== String -> Maybe String
forall a. a -> Maybe a
Just String
name) (Maybe String -> Bool)
-> ([Attribute] -> Maybe String) -> [Attribute] -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Attribute] -> Maybe String
getFriendlyName)
filterByLocalKeyId :: BS.ByteString -> SafeContents -> SafeContents
filterByLocalKeyId :: ByteString -> SafeContents -> SafeContents
filterByLocalKeyId ByteString
d = ([Attribute] -> Bool) -> SafeContents -> SafeContents
filterBags ((Maybe ByteString -> Maybe ByteString -> Bool
forall a. Eq a => a -> a -> Bool
== ByteString -> Maybe ByteString
forall a. a -> Maybe a
Just ByteString
d) (Maybe ByteString -> Bool)
-> ([Attribute] -> Maybe ByteString) -> [Attribute] -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Attribute] -> Maybe ByteString
getLocalKeyId)
getSafeKeysId :: SafeContents -> [OptProtected (Id X509.PrivKey)]
getSafeKeysId :: SafeContents -> [OptProtected (Id PrivKey)]
getSafeKeysId (SafeContents [SafeBag]
scs) = [SafeBag] -> [OptProtected (Id PrivKey)]
loop [SafeBag]
scs
where
loop :: [SafeBag] -> [OptProtected (Id PrivKey)]
loop [] = []
loop (SafeBag
bag : [SafeBag]
bags) =
case SafeBag -> SafeInfo
forall info. Bag info -> info
bagInfo SafeBag
bag of
KeyBag (FormattedKey PrivateKeyFormat
_ PrivKey
k) -> Id PrivKey -> OptProtected (Id PrivKey)
forall a. a -> OptProtected a
Unprotected (PrivKey -> SafeBag -> Id PrivKey
forall a info. a -> Bag info -> Id a
mkId PrivKey
k SafeBag
bag) OptProtected (Id PrivKey)
-> [OptProtected (Id PrivKey)] -> [OptProtected (Id PrivKey)]
forall a. a -> [a] -> [a]
: [SafeBag] -> [OptProtected (Id PrivKey)]
loop [SafeBag]
bags
PKCS8ShroudedKeyBag PKCS5
k -> (ProtectionPassword -> Either StoreError (Id PrivKey))
-> OptProtected (Id PrivKey)
forall a.
(ProtectionPassword -> Either StoreError a) -> OptProtected a
Protected (PKCS5
-> SafeBag -> ProtectionPassword -> Either StoreError (Id PrivKey)
forall {a} {info}.
(ParseASN1Object [ASN1Event] (Traditional a),
ParseASN1Object [ASN1Event] (Modern a)) =>
PKCS5 -> Bag info -> ProtectionPassword -> Either StoreError (Id a)
unshroud PKCS5
k SafeBag
bag) OptProtected (Id PrivKey)
-> [OptProtected (Id PrivKey)] -> [OptProtected (Id PrivKey)]
forall a. a -> [a] -> [a]
: [SafeBag] -> [OptProtected (Id PrivKey)]
loop [SafeBag]
bags
SafeContentsBag SafeContents
inner -> SafeContents -> [OptProtected (Id PrivKey)]
getSafeKeysId SafeContents
inner [OptProtected (Id PrivKey)]
-> [OptProtected (Id PrivKey)] -> [OptProtected (Id PrivKey)]
forall a. [a] -> [a] -> [a]
++ [SafeBag] -> [OptProtected (Id PrivKey)]
loop [SafeBag]
bags
SafeInfo
_ -> [SafeBag] -> [OptProtected (Id PrivKey)]
loop [SafeBag]
bags
unshroud :: PKCS5 -> Bag info -> ProtectionPassword -> Either StoreError (Id a)
unshroud PKCS5
shrouded Bag info
bag ProtectionPassword
pwd = do
ByteString
bs <- PKCS5 -> ProtectionPassword -> Either StoreError ByteString
decrypt PKCS5
shrouded ProtectionPassword
pwd
FormattedKey PrivateKeyFormat
_ a
k <- ByteString -> Either StoreError (FormattedKey a)
forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decode ByteString
bs
Id a -> Either StoreError (Id a)
forall a. a -> Either StoreError a
forall (m :: * -> *) a. Monad m => a -> m a
return (a -> Bag info -> Id a
forall a info. a -> Bag info -> Id a
mkId a
k Bag info
bag)
getSafeKeys :: SafeContents -> [OptProtected X509.PrivKey]
getSafeKeys :: SafeContents -> [OptProtected PrivKey]
getSafeKeys = (OptProtected (Id PrivKey) -> OptProtected PrivKey)
-> [OptProtected (Id PrivKey)] -> [OptProtected PrivKey]
forall a b. (a -> b) -> [a] -> [b]
map ((Id PrivKey -> PrivKey)
-> OptProtected (Id PrivKey) -> OptProtected PrivKey
forall a b. (a -> b) -> OptProtected a -> OptProtected b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Id PrivKey -> PrivKey
forall a. Id a -> a
unId) ([OptProtected (Id PrivKey)] -> [OptProtected PrivKey])
-> (SafeContents -> [OptProtected (Id PrivKey)])
-> SafeContents
-> [OptProtected PrivKey]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SafeContents -> [OptProtected (Id PrivKey)]
getSafeKeysId
getAllSafeKeysId :: [SafeContents] -> OptProtected [Id X509.PrivKey]
getAllSafeKeysId :: [SafeContents] -> OptProtected [Id PrivKey]
getAllSafeKeysId = [OptProtected (Id PrivKey)] -> OptProtected [Id PrivKey]
forall a. [OptProtected a] -> OptProtected [a]
applySamePassword ([OptProtected (Id PrivKey)] -> OptProtected [Id PrivKey])
-> ([SafeContents] -> [OptProtected (Id PrivKey)])
-> [SafeContents]
-> OptProtected [Id PrivKey]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (SafeContents -> [OptProtected (Id PrivKey)])
-> [SafeContents] -> [OptProtected (Id PrivKey)]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap SafeContents -> [OptProtected (Id PrivKey)]
getSafeKeysId
getAllSafeKeys :: [SafeContents] -> OptProtected [X509.PrivKey]
getAllSafeKeys :: [SafeContents] -> OptProtected [PrivKey]
getAllSafeKeys = [OptProtected PrivKey] -> OptProtected [PrivKey]
forall a. [OptProtected a] -> OptProtected [a]
applySamePassword ([OptProtected PrivKey] -> OptProtected [PrivKey])
-> ([SafeContents] -> [OptProtected PrivKey])
-> [SafeContents]
-> OptProtected [PrivKey]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (SafeContents -> [OptProtected PrivKey])
-> [SafeContents] -> [OptProtected PrivKey]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap SafeContents -> [OptProtected PrivKey]
getSafeKeys
getSafeX509CertsId :: SafeContents -> [Id X509.SignedCertificate]
getSafeX509CertsId :: SafeContents -> [Id SignedCertificate]
getSafeX509CertsId (SafeContents [SafeBag]
scs) = [SafeBag] -> [Id SignedCertificate]
loop [SafeBag]
scs
where
loop :: [SafeBag] -> [Id SignedCertificate]
loop [] = []
loop (SafeBag
bag : [SafeBag]
bags) =
case SafeBag -> SafeInfo
forall info. Bag info -> info
bagInfo SafeBag
bag of
CertBag (Bag (CertX509 SignedCertificate
c) [Attribute]
_) -> SignedCertificate -> SafeBag -> Id SignedCertificate
forall a info. a -> Bag info -> Id a
mkId SignedCertificate
c SafeBag
bag Id SignedCertificate
-> [Id SignedCertificate] -> [Id SignedCertificate]
forall a. a -> [a] -> [a]
: [SafeBag] -> [Id SignedCertificate]
loop [SafeBag]
bags
SafeContentsBag SafeContents
inner -> SafeContents -> [Id SignedCertificate]
getSafeX509CertsId SafeContents
inner [Id SignedCertificate]
-> [Id SignedCertificate] -> [Id SignedCertificate]
forall a. [a] -> [a] -> [a]
++ [SafeBag] -> [Id SignedCertificate]
loop [SafeBag]
bags
SafeInfo
_ -> [SafeBag] -> [Id SignedCertificate]
loop [SafeBag]
bags
getSafeX509Certs :: SafeContents -> [X509.SignedCertificate]
getSafeX509Certs :: SafeContents -> [SignedCertificate]
getSafeX509Certs = (Id SignedCertificate -> SignedCertificate)
-> [Id SignedCertificate] -> [SignedCertificate]
forall a b. (a -> b) -> [a] -> [b]
map Id SignedCertificate -> SignedCertificate
forall a. Id a -> a
unId ([Id SignedCertificate] -> [SignedCertificate])
-> (SafeContents -> [Id SignedCertificate])
-> SafeContents
-> [SignedCertificate]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SafeContents -> [Id SignedCertificate]
getSafeX509CertsId
getAllSafeX509Certs :: [SafeContents] -> [X509.SignedCertificate]
getAllSafeX509Certs :: [SafeContents] -> [SignedCertificate]
getAllSafeX509Certs = (SafeContents -> [SignedCertificate])
-> [SafeContents] -> [SignedCertificate]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap SafeContents -> [SignedCertificate]
getSafeX509Certs
getSafeX509CRLsId :: SafeContents -> [Id X509.SignedCRL]
getSafeX509CRLsId :: SafeContents -> [Id SignedCRL]
getSafeX509CRLsId (SafeContents [SafeBag]
scs) = [SafeBag] -> [Id SignedCRL]
loop [SafeBag]
scs
where
loop :: [SafeBag] -> [Id SignedCRL]
loop [] = []
loop (SafeBag
bag : [SafeBag]
bags) =
case SafeBag -> SafeInfo
forall info. Bag info -> info
bagInfo SafeBag
bag of
CRLBag (Bag (CRLX509 SignedCRL
c) [Attribute]
_) -> SignedCRL -> SafeBag -> Id SignedCRL
forall a info. a -> Bag info -> Id a
mkId SignedCRL
c SafeBag
bag Id SignedCRL -> [Id SignedCRL] -> [Id SignedCRL]
forall a. a -> [a] -> [a]
: [SafeBag] -> [Id SignedCRL]
loop [SafeBag]
bags
SafeContentsBag SafeContents
inner -> SafeContents -> [Id SignedCRL]
getSafeX509CRLsId SafeContents
inner [Id SignedCRL] -> [Id SignedCRL] -> [Id SignedCRL]
forall a. [a] -> [a] -> [a]
++ [SafeBag] -> [Id SignedCRL]
loop [SafeBag]
bags
SafeInfo
_ -> [SafeBag] -> [Id SignedCRL]
loop [SafeBag]
bags
getSafeX509CRLs :: SafeContents -> [X509.SignedCRL]
getSafeX509CRLs :: SafeContents -> [SignedCRL]
getSafeX509CRLs = (Id SignedCRL -> SignedCRL) -> [Id SignedCRL] -> [SignedCRL]
forall a b. (a -> b) -> [a] -> [b]
map Id SignedCRL -> SignedCRL
forall a. Id a -> a
unId ([Id SignedCRL] -> [SignedCRL])
-> (SafeContents -> [Id SignedCRL]) -> SafeContents -> [SignedCRL]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SafeContents -> [Id SignedCRL]
getSafeX509CRLsId
getAllSafeX509CRLs :: [SafeContents] -> [X509.SignedCRL]
getAllSafeX509CRLs :: [SafeContents] -> [SignedCRL]
getAllSafeX509CRLs = (SafeContents -> [SignedCRL]) -> [SafeContents] -> [SignedCRL]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap SafeContents -> [SignedCRL]
getSafeX509CRLs
getInnerCredential :: [SafeContents] -> SamePassword (Maybe (X509.CertificateChain, X509.PrivKey))
getInnerCredential :: [SafeContents] -> SamePassword (Maybe (CertificateChain, PrivKey))
getInnerCredential [SafeContents]
l = OptProtected (Maybe (CertificateChain, PrivKey))
-> SamePassword (Maybe (CertificateChain, PrivKey))
forall a. OptProtected a -> SamePassword a
SamePassword ([Id PrivKey] -> Maybe (CertificateChain, PrivKey)
fn ([Id PrivKey] -> Maybe (CertificateChain, PrivKey))
-> OptProtected [Id PrivKey]
-> OptProtected (Maybe (CertificateChain, PrivKey))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> [SafeContents] -> OptProtected [Id PrivKey]
getAllSafeKeysId [SafeContents]
l)
where
certs :: [SignedCertificate]
certs = [SafeContents] -> [SignedCertificate]
getAllSafeX509Certs [SafeContents]
l
fn :: [Id PrivKey] -> Maybe (CertificateChain, PrivKey)
fn [Id PrivKey]
idKeys = do
Id PrivKey
iKey <- [Id PrivKey] -> Maybe (Id PrivKey)
forall a. [a] -> Maybe a
single [Id PrivKey]
idKeys
let k :: PrivKey
k = Id PrivKey -> PrivKey
forall a. Id a -> a
unId Id PrivKey
iKey
case Id PrivKey -> Maybe ByteString
forall a. Id a -> Maybe ByteString
idKeyId Id PrivKey
iKey of
Just ByteString
d -> do
let filtered :: [SafeContents]
filtered = (SafeContents -> SafeContents) -> [SafeContents] -> [SafeContents]
forall a b. (a -> b) -> [a] -> [b]
map (ByteString -> SafeContents -> SafeContents
filterByLocalKeyId ByteString
d) [SafeContents]
l
SignedCertificate
leaf <- [SignedCertificate] -> Maybe SignedCertificate
forall a. [a] -> Maybe a
single ([SafeContents] -> [SignedCertificate]
getAllSafeX509Certs [SafeContents]
filtered)
(CertificateChain, PrivKey) -> Maybe (CertificateChain, PrivKey)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (SignedCertificate -> [SignedCertificate] -> CertificateChain
buildCertificateChain SignedCertificate
leaf [SignedCertificate]
certs, PrivKey
k)
Maybe ByteString
Nothing ->
case Id PrivKey -> Maybe String
forall a. Id a -> Maybe String
idName Id PrivKey
iKey of
Just String
name -> do
let filtered :: [SafeContents]
filtered = (SafeContents -> SafeContents) -> [SafeContents] -> [SafeContents]
forall a b. (a -> b) -> [a] -> [b]
map (String -> SafeContents -> SafeContents
filterByFriendlyName String
name) [SafeContents]
l
SignedCertificate
leaf <- [SignedCertificate] -> Maybe SignedCertificate
forall a. [a] -> Maybe a
single ([SafeContents] -> [SignedCertificate]
getAllSafeX509Certs [SafeContents]
filtered)
(CertificateChain, PrivKey) -> Maybe (CertificateChain, PrivKey)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (SignedCertificate -> [SignedCertificate] -> CertificateChain
buildCertificateChain SignedCertificate
leaf [SignedCertificate]
certs, PrivKey
k)
Maybe String
Nothing -> do
Bool -> Maybe ()
forall (f :: * -> *). Alternative f => Bool -> f ()
guard (Bool -> Bool
not (Bool -> Bool) -> Bool -> Bool
forall a b. (a -> b) -> a -> b
$ [SignedCertificate] -> Bool
forall a. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [SignedCertificate]
certs)
(CertificateChain, PrivKey) -> Maybe (CertificateChain, PrivKey)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ([SignedCertificate] -> CertificateChain
X509.CertificateChain [SignedCertificate]
certs, PrivKey
k)
toCredential :: PKCS12 -> OptProtected (Maybe (X509.CertificateChain, X509.PrivKey))
toCredential :: PKCS12 -> OptProtected (Maybe (CertificateChain, PrivKey))
toCredential PKCS12
p12 =
SamePassword (Maybe (CertificateChain, PrivKey))
-> OptProtected (Maybe (CertificateChain, PrivKey))
forall a. SamePassword a -> OptProtected a
unSamePassword (OptProtected [SafeContents] -> SamePassword [SafeContents]
forall a. OptProtected a -> SamePassword a
SamePassword (PKCS12 -> OptProtected [SafeContents]
unPKCS12 PKCS12
p12) SamePassword [SafeContents]
-> ([SafeContents]
-> SamePassword (Maybe (CertificateChain, PrivKey)))
-> SamePassword (Maybe (CertificateChain, PrivKey))
forall a b.
SamePassword a -> (a -> SamePassword b) -> SamePassword b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= [SafeContents] -> SamePassword (Maybe (CertificateChain, PrivKey))
getInnerCredential)
getInnerCredentialNamed :: String -> [SafeContents] -> SamePassword (Maybe (X509.CertificateChain, X509.PrivKey))
getInnerCredentialNamed :: String
-> [SafeContents]
-> SamePassword (Maybe (CertificateChain, PrivKey))
getInnerCredentialNamed String
name [SafeContents]
l = OptProtected (Maybe (CertificateChain, PrivKey))
-> SamePassword (Maybe (CertificateChain, PrivKey))
forall a. OptProtected a -> SamePassword a
SamePassword ([PrivKey] -> Maybe (CertificateChain, PrivKey)
fn ([PrivKey] -> Maybe (CertificateChain, PrivKey))
-> OptProtected [PrivKey]
-> OptProtected (Maybe (CertificateChain, PrivKey))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> [SafeContents] -> OptProtected [PrivKey]
getAllSafeKeys [SafeContents]
filtered)
where
certs :: [SignedCertificate]
certs = [SafeContents] -> [SignedCertificate]
getAllSafeX509Certs [SafeContents]
l
filtered :: [SafeContents]
filtered = (SafeContents -> SafeContents) -> [SafeContents] -> [SafeContents]
forall a b. (a -> b) -> [a] -> [b]
map (String -> SafeContents -> SafeContents
filterByFriendlyName String
name) [SafeContents]
l
fn :: [PrivKey] -> Maybe (CertificateChain, PrivKey)
fn [PrivKey]
keys = do
PrivKey
k <- [PrivKey] -> Maybe PrivKey
forall a. [a] -> Maybe a
single [PrivKey]
keys
SignedCertificate
leaf <- [SignedCertificate] -> Maybe SignedCertificate
forall a. [a] -> Maybe a
single ([SafeContents] -> [SignedCertificate]
getAllSafeX509Certs [SafeContents]
filtered)
(CertificateChain, PrivKey) -> Maybe (CertificateChain, PrivKey)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (SignedCertificate -> [SignedCertificate] -> CertificateChain
buildCertificateChain SignedCertificate
leaf [SignedCertificate]
certs, PrivKey
k)
toNamedCredential :: String -> PKCS12 -> OptProtected (Maybe (X509.CertificateChain, X509.PrivKey))
toNamedCredential :: String
-> PKCS12 -> OptProtected (Maybe (CertificateChain, PrivKey))
toNamedCredential String
name PKCS12
p12 = SamePassword (Maybe (CertificateChain, PrivKey))
-> OptProtected (Maybe (CertificateChain, PrivKey))
forall a. SamePassword a -> OptProtected a
unSamePassword (SamePassword (Maybe (CertificateChain, PrivKey))
-> OptProtected (Maybe (CertificateChain, PrivKey)))
-> SamePassword (Maybe (CertificateChain, PrivKey))
-> OptProtected (Maybe (CertificateChain, PrivKey))
forall a b. (a -> b) -> a -> b
$
OptProtected [SafeContents] -> SamePassword [SafeContents]
forall a. OptProtected a -> SamePassword a
SamePassword (PKCS12 -> OptProtected [SafeContents]
unPKCS12 PKCS12
p12) SamePassword [SafeContents]
-> ([SafeContents]
-> SamePassword (Maybe (CertificateChain, PrivKey)))
-> SamePassword (Maybe (CertificateChain, PrivKey))
forall a b.
SamePassword a -> (a -> SamePassword b) -> SamePassword b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= String
-> [SafeContents]
-> SamePassword (Maybe (CertificateChain, PrivKey))
getInnerCredentialNamed String
name
fromCredential :: Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (X509.CertificateChain, X509.PrivKey)
-> Either StoreError PKCS12
fromCredential :: Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (CertificateChain, PrivKey)
-> Either StoreError PKCS12
fromCredential = ([Attribute] -> [Attribute])
-> Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (CertificateChain, PrivKey)
-> Either StoreError PKCS12
fromCredential' [Attribute] -> [Attribute]
forall a. a -> a
id
fromNamedCredential :: String
-> Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (X509.CertificateChain, X509.PrivKey)
-> Either StoreError PKCS12
fromNamedCredential :: String
-> Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (CertificateChain, PrivKey)
-> Either StoreError PKCS12
fromNamedCredential String
name = ([Attribute] -> [Attribute])
-> Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (CertificateChain, PrivKey)
-> Either StoreError PKCS12
fromCredential' (String -> [Attribute] -> [Attribute]
setFriendlyName String
name)
fromCredential' :: ([Attribute] -> [Attribute])
-> Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (X509.CertificateChain, X509.PrivKey)
-> Either StoreError PKCS12
fromCredential' :: ([Attribute] -> [Attribute])
-> Maybe EncryptionScheme
-> EncryptionScheme
-> ProtectionPassword
-> (CertificateChain, PrivKey)
-> Either StoreError PKCS12
fromCredential' [Attribute] -> [Attribute]
_ Maybe EncryptionScheme
_ EncryptionScheme
_ ProtectionPassword
_ (X509.CertificateChain [], PrivKey
_) =
StoreError -> Either StoreError PKCS12
forall a b. a -> Either a b
Left (String -> StoreError
InvalidInput String
"Empty certificate chain")
fromCredential' [Attribute] -> [Attribute]
trans Maybe EncryptionScheme
algChain EncryptionScheme
algKey ProtectionPassword
pwd (X509.CertificateChain certs :: [SignedCertificate]
certs@(SignedCertificate
leaf:[SignedCertificate]
_), PrivKey
key) =
PKCS12 -> PKCS12 -> PKCS12
forall a. Semigroup a => a -> a -> a
(<>) (PKCS12 -> PKCS12 -> PKCS12)
-> Either StoreError PKCS12 -> Either StoreError (PKCS12 -> PKCS12)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Either StoreError PKCS12
pkcs12Chain Either StoreError (PKCS12 -> PKCS12)
-> Either StoreError PKCS12 -> Either StoreError PKCS12
forall a b.
Either StoreError (a -> b)
-> Either StoreError a -> Either StoreError b
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Either StoreError PKCS12
pkcs12Key
where
pkcs12Key :: Either StoreError PKCS12
pkcs12Key = SafeContents -> PKCS12
unencrypted (SafeContents -> PKCS12)
-> Either StoreError SafeContents -> Either StoreError PKCS12
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Either StoreError SafeContents
scKeyOrError
pkcs12Chain :: Either StoreError PKCS12
pkcs12Chain =
case Maybe EncryptionScheme
algChain of
Just EncryptionScheme
alg -> EncryptionScheme
-> ProtectionPassword -> SafeContents -> Either StoreError PKCS12
encrypted EncryptionScheme
alg ProtectionPassword
pwd SafeContents
scChain
Maybe EncryptionScheme
Nothing -> PKCS12 -> Either StoreError PKCS12
forall a b. b -> Either a b
Right (SafeContents -> PKCS12
unencrypted SafeContents
scChain)
scChain :: SafeContents
scChain = [SafeBag] -> SafeContents
SafeContents (([Attribute] -> SignedCertificate -> SafeBag)
-> [[Attribute]] -> [SignedCertificate] -> [SafeBag]
forall a b c. (a -> b -> c) -> [a] -> [b] -> [c]
zipWith [Attribute] -> SignedCertificate -> SafeBag
toCertBag [[Attribute]]
certAttrs [SignedCertificate]
certs)
certAttrs :: [[Attribute]]
certAttrs = [Attribute]
attrs [Attribute] -> [[Attribute]] -> [[Attribute]]
forall a. a -> [a] -> [a]
: [Attribute] -> [[Attribute]]
forall a. a -> [a]
repeat []
toCertBag :: [Attribute] -> SignedCertificate -> SafeBag
toCertBag [Attribute]
a SignedCertificate
c = SafeInfo -> [Attribute] -> SafeBag
forall info. info -> [Attribute] -> Bag info
Bag (Bag CertInfo -> SafeInfo
CertBag (CertInfo -> [Attribute] -> Bag CertInfo
forall info. info -> [Attribute] -> Bag info
Bag (SignedCertificate -> CertInfo
CertX509 SignedCertificate
c) [])) [Attribute]
a
scKeyOrError :: Either StoreError SafeContents
scKeyOrError = PKCS5 -> SafeContents
wrap (PKCS5 -> SafeContents)
-> Either StoreError PKCS5 -> Either StoreError SafeContents
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> EncryptionScheme
-> ProtectionPassword -> ByteString -> Either StoreError PKCS5
encrypt EncryptionScheme
algKey ProtectionPassword
pwd ByteString
encodedKey
wrap :: PKCS5 -> SafeContents
wrap PKCS5
shrouded = [SafeBag] -> SafeContents
SafeContents [SafeInfo -> [Attribute] -> SafeBag
forall info. info -> [Attribute] -> Bag info
Bag (PKCS5 -> SafeInfo
PKCS8ShroudedKeyBag PKCS5
shrouded) [Attribute]
attrs]
encodedKey :: ByteString
encodedKey = FormattedKey PrivKey -> ByteString
forall obj. ProduceASN1Object ASN1P obj => obj -> ByteString
encodeASN1Object (PrivateKeyFormat -> PrivKey -> FormattedKey PrivKey
forall a. PrivateKeyFormat -> a -> FormattedKey a
FormattedKey PrivateKeyFormat
PKCS8Format PrivKey
key)
X509.Fingerprint ByteString
keyId = SignedCertificate -> HashALG -> Fingerprint
forall a.
(Show a, Eq a, ASN1Object a) =>
SignedExact a -> HashALG -> Fingerprint
X509.getFingerprint SignedCertificate
leaf HashALG
X509.HashSHA1
attrs :: [Attribute]
attrs = [Attribute] -> [Attribute]
trans (ByteString -> [Attribute] -> [Attribute]
setLocalKeyId ByteString
keyId [])
friendlyName :: OID
friendlyName :: OID
friendlyName = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
9,Integer
20]
getFriendlyName :: [Attribute] -> Maybe String
getFriendlyName :: [Attribute] -> Maybe String
getFriendlyName [Attribute]
attrs = OID -> [Attribute] -> ParseASN1 () String -> Maybe String
forall a. OID -> [Attribute] -> ParseASN1 () a -> Maybe a
runParseAttribute OID
friendlyName [Attribute]
attrs (ParseASN1 () String -> Maybe String)
-> ParseASN1 () String -> Maybe String
forall a b. (a -> b) -> a -> b
$ do
ASN1String ASN1CharacterString
str <- ParseASN1 () ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
case ASN1CharacterString -> Maybe String
asn1CharacterToString ASN1CharacterString
str of
Maybe String
Nothing -> String -> ParseASN1 () String
forall e a. String -> ParseASN1 e a
throwParseError String
"Invalid friendlyName value"
Just String
s -> String -> ParseASN1 () String
forall a. a -> ParseASN1 () a
forall (m :: * -> *) a. Monad m => a -> m a
return String
s
setFriendlyName :: String -> [Attribute] -> [Attribute]
setFriendlyName :: String -> [Attribute] -> [Attribute]
setFriendlyName String
name = OID -> ASN1S -> [Attribute] -> [Attribute]
setAttributeASN1S OID
friendlyName (String -> ASN1S
forall e. ASN1Elem e => String -> ASN1Stream e
gBMPString String
name)
localKeyId :: OID
localKeyId :: OID
localKeyId = [Integer
1,Integer
2,Integer
840,Integer
113549,Integer
1,Integer
9,Integer
21]
getLocalKeyId :: [Attribute] -> Maybe BS.ByteString
getLocalKeyId :: [Attribute] -> Maybe ByteString
getLocalKeyId [Attribute]
attrs = OID -> [Attribute] -> ParseASN1 () ByteString -> Maybe ByteString
forall a. OID -> [Attribute] -> ParseASN1 () a -> Maybe a
runParseAttribute OID
localKeyId [Attribute]
attrs (ParseASN1 () ByteString -> Maybe ByteString)
-> ParseASN1 () ByteString -> Maybe ByteString
forall a b. (a -> b) -> a -> b
$ do
OctetString ByteString
d <- ParseASN1 () ASN1
forall e. Monoid e => ParseASN1 e ASN1
getNext
ByteString -> ParseASN1 () ByteString
forall a. a -> ParseASN1 () a
forall (m :: * -> *) a. Monad m => a -> m a
return ByteString
d
setLocalKeyId :: BS.ByteString -> [Attribute] -> [Attribute]
setLocalKeyId :: ByteString -> [Attribute] -> [Attribute]
setLocalKeyId ByteString
d = OID -> ASN1S -> [Attribute] -> [Attribute]
setAttributeASN1S OID
localKeyId (ByteString -> ASN1S
forall e. ASN1Elem e => ByteString -> ASN1Stream e
gOctetString ByteString
d)
newtype SamePassword a = SamePassword { forall a. SamePassword a -> OptProtected a
unSamePassword :: OptProtected a }
instance Functor SamePassword where
fmap :: forall a b. (a -> b) -> SamePassword a -> SamePassword b
fmap a -> b
f (SamePassword OptProtected a
opt) = OptProtected b -> SamePassword b
forall a. OptProtected a -> SamePassword a
SamePassword ((a -> b) -> OptProtected a -> OptProtected b
forall a b. (a -> b) -> OptProtected a -> OptProtected b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap a -> b
f OptProtected a
opt)
instance Applicative SamePassword where
pure :: forall a. a -> SamePassword a
pure a
a = OptProtected a -> SamePassword a
forall a. OptProtected a -> SamePassword a
SamePassword (a -> OptProtected a
forall a. a -> OptProtected a
Unprotected a
a)
SamePassword (Unprotected a -> b
f) <*> :: forall a b.
SamePassword (a -> b) -> SamePassword a -> SamePassword b
<*> SamePassword (Unprotected a
x) =
OptProtected b -> SamePassword b
forall a. OptProtected a -> SamePassword a
SamePassword (b -> OptProtected b
forall a. a -> OptProtected a
Unprotected (a -> b
f a
x))
SamePassword (Unprotected a -> b
f) <*> SamePassword (Protected ProtectionPassword -> Either StoreError a
x) =
OptProtected b -> SamePassword b
forall a. OptProtected a -> SamePassword a
SamePassword (OptProtected b -> SamePassword b)
-> OptProtected b -> SamePassword b
forall a b. (a -> b) -> a -> b
$ (ProtectionPassword -> Either StoreError b) -> OptProtected b
forall a.
(ProtectionPassword -> Either StoreError a) -> OptProtected a
Protected ((a -> b) -> Either StoreError a -> Either StoreError b
forall a b. (a -> b) -> Either StoreError a -> Either StoreError b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap a -> b
f (Either StoreError a -> Either StoreError b)
-> (ProtectionPassword -> Either StoreError a)
-> ProtectionPassword
-> Either StoreError b
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ProtectionPassword -> Either StoreError a
x)
SamePassword (Protected ProtectionPassword -> Either StoreError (a -> b)
f) <*> SamePassword (Unprotected a
x) =
OptProtected b -> SamePassword b
forall a. OptProtected a -> SamePassword a
SamePassword (OptProtected b -> SamePassword b)
-> OptProtected b -> SamePassword b
forall a b. (a -> b) -> a -> b
$ (ProtectionPassword -> Either StoreError b) -> OptProtected b
forall a.
(ProtectionPassword -> Either StoreError a) -> OptProtected a
Protected (((a -> b) -> b)
-> Either StoreError (a -> b) -> Either StoreError b
forall a b. (a -> b) -> Either StoreError a -> Either StoreError b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ((a -> b) -> a -> b
forall a b. (a -> b) -> a -> b
$ a
x) (Either StoreError (a -> b) -> Either StoreError b)
-> (ProtectionPassword -> Either StoreError (a -> b))
-> ProtectionPassword
-> Either StoreError b
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ProtectionPassword -> Either StoreError (a -> b)
f)
SamePassword (Protected ProtectionPassword -> Either StoreError (a -> b)
f) <*> SamePassword (Protected ProtectionPassword -> Either StoreError a
x) =
OptProtected b -> SamePassword b
forall a. OptProtected a -> SamePassword a
SamePassword (OptProtected b -> SamePassword b)
-> OptProtected b -> SamePassword b
forall a b. (a -> b) -> a -> b
$ (ProtectionPassword -> Either StoreError b) -> OptProtected b
forall a.
(ProtectionPassword -> Either StoreError a) -> OptProtected a
Protected (\ProtectionPassword
pwd -> ProtectionPassword -> Either StoreError (a -> b)
f ProtectionPassword
pwd Either StoreError (a -> b)
-> Either StoreError a -> Either StoreError b
forall a b.
Either StoreError (a -> b)
-> Either StoreError a -> Either StoreError b
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> ProtectionPassword -> Either StoreError a
x ProtectionPassword
pwd)
instance Monad SamePassword where
return :: forall a. a -> SamePassword a
return = a -> SamePassword a
forall a. a -> SamePassword a
forall (f :: * -> *) a. Applicative f => a -> f a
pure
SamePassword (Unprotected a
x) >>= :: forall a b.
SamePassword a -> (a -> SamePassword b) -> SamePassword b
>>= a -> SamePassword b
f = a -> SamePassword b
f a
x
SamePassword (Protected ProtectionPassword -> Either StoreError a
inner) >>= a -> SamePassword b
f =
OptProtected b -> SamePassword b
forall a. OptProtected a -> SamePassword a
SamePassword (OptProtected b -> SamePassword b)
-> ((ProtectionPassword -> Either StoreError b) -> OptProtected b)
-> (ProtectionPassword -> Either StoreError b)
-> SamePassword b
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ProtectionPassword -> Either StoreError b) -> OptProtected b
forall a.
(ProtectionPassword -> Either StoreError a) -> OptProtected a
Protected ((ProtectionPassword -> Either StoreError b) -> SamePassword b)
-> (ProtectionPassword -> Either StoreError b) -> SamePassword b
forall a b. (a -> b) -> a -> b
$ \ProtectionPassword
pwd ->
case ProtectionPassword -> Either StoreError a
inner ProtectionPassword
pwd of
Left StoreError
err -> StoreError -> Either StoreError b
forall a b. a -> Either a b
Left StoreError
err
Right a
x -> ProtectionPassword -> OptProtected b -> Either StoreError b
forall a.
ProtectionPassword -> OptProtected a -> Either StoreError a
recover ProtectionPassword
pwd (SamePassword b -> OptProtected b
forall a. SamePassword a -> OptProtected a
unSamePassword (SamePassword b -> OptProtected b)
-> SamePassword b -> OptProtected b
forall a b. (a -> b) -> a -> b
$ a -> SamePassword b
f a
x)
applySamePassword :: [OptProtected a] -> OptProtected [a]
applySamePassword :: forall a. [OptProtected a] -> OptProtected [a]
applySamePassword = SamePassword [a] -> OptProtected [a]
forall a. SamePassword a -> OptProtected a
unSamePassword (SamePassword [a] -> OptProtected [a])
-> ([OptProtected a] -> SamePassword [a])
-> [OptProtected a]
-> OptProtected [a]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (OptProtected a -> SamePassword a)
-> [OptProtected a] -> SamePassword [a]
forall (t :: * -> *) (f :: * -> *) a b.
(Traversable t, Applicative f) =>
(a -> f b) -> t a -> f (t b)
forall (f :: * -> *) a b.
Applicative f =>
(a -> f b) -> [a] -> f [b]
traverse OptProtected a -> SamePassword a
forall a. OptProtected a -> SamePassword a
SamePassword
single :: [a] -> Maybe a
single :: forall a. [a] -> Maybe a
single [a
x] = a -> Maybe a
forall a. a -> Maybe a
Just a
x
single [a]
_ = Maybe a
forall a. Maybe a
Nothing
data Id a = Id
{ forall a. Id a -> a
unId :: a
, forall a. Id a -> Maybe ByteString
idKeyId :: Maybe BS.ByteString
, forall a. Id a -> Maybe String
idName :: Maybe String
}
mkId :: a -> Bag info -> Id a
mkId :: forall a info. a -> Bag info -> Id a
mkId a
val Bag info
bag = a
val a -> Id a -> Id a
forall a b. a -> b -> b
`seq` a -> Maybe ByteString -> Maybe String -> Id a
forall a. a -> Maybe ByteString -> Maybe String -> Id a
Id a
val ([Attribute] -> Maybe ByteString
getLocalKeyId [Attribute]
attrs) ([Attribute] -> Maybe String
getFriendlyName [Attribute]
attrs)
where attrs :: [Attribute]
attrs = Bag info -> [Attribute]
forall info. Bag info -> [Attribute]
bagAttributes Bag info
bag
decode :: ParseASN1Object [ASN1Event] obj => BS.ByteString -> Either StoreError obj
decode :: forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decode = ByteString -> Either StoreError obj
forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decodeASN1Object
parseOctetStringObject :: (Monoid e, ParseASN1Object [ASN1Event] obj)
=> String -> ParseASN1 e obj
parseOctetStringObject :: forall e obj.
(Monoid e, ParseASN1Object [ASN1Event] obj) =>
String -> ParseASN1 e obj
parseOctetStringObject String
name = do
ByteString
bs <- ParseASN1 e ByteString
forall e. Monoid e => ParseASN1 e ByteString
parseOctetString
case ByteString -> Either StoreError obj
forall obj.
ParseASN1Object [ASN1Event] obj =>
ByteString -> Either StoreError obj
decode ByteString
bs of
Left StoreError
e -> String -> ParseASN1 e obj
forall e a. String -> ParseASN1 e a
throwParseError (String
name String -> ShowS
forall a. [a] -> [a] -> [a]
++ String
": " String -> ShowS
forall a. [a] -> [a] -> [a]
++ StoreError -> String
forall a. Show a => a -> String
show StoreError
e)
Right obj
c -> obj -> ParseASN1 e obj
forall a. a -> ParseASN1 e a
forall (m :: * -> *) a. Monad m => a -> m a
return obj
c
buildCertificateChain :: X509.SignedCertificate -> [X509.SignedCertificate]
-> X509.CertificateChain
buildCertificateChain :: SignedCertificate -> [SignedCertificate] -> CertificateChain
buildCertificateChain SignedCertificate
leaf [SignedCertificate]
authorities =
[SignedCertificate] -> CertificateChain
X509.CertificateChain (SignedCertificate
leaf SignedCertificate -> [SignedCertificate] -> [SignedCertificate]
forall a. a -> [a] -> [a]
: SignedCertificate -> [SignedCertificate] -> [SignedCertificate]
findAuthorities SignedCertificate
leaf [SignedCertificate]
authorities)
where
findAuthorities :: SignedCertificate -> [SignedCertificate] -> [SignedCertificate]
findAuthorities SignedCertificate
cert [SignedCertificate]
others
| SignedCertificate -> DistinguishedName
subject SignedCertificate
cert DistinguishedName -> DistinguishedName -> Bool
forall a. Eq a => a -> a -> Bool
== SignedCertificate -> DistinguishedName
issuer SignedCertificate
cert = []
| Bool
otherwise =
case (SignedCertificate -> Bool)
-> [SignedCertificate]
-> ([SignedCertificate], [SignedCertificate])
forall a. (a -> Bool) -> [a] -> ([a], [a])
partition (\SignedCertificate
c -> SignedCertificate -> DistinguishedName
subject SignedCertificate
c DistinguishedName -> DistinguishedName -> Bool
forall a. Eq a => a -> a -> Bool
== SignedCertificate -> DistinguishedName
issuer SignedCertificate
cert) [SignedCertificate]
others of
([SignedCertificate
c], [SignedCertificate]
others') -> SignedCertificate
c SignedCertificate -> [SignedCertificate] -> [SignedCertificate]
forall a. a -> [a] -> [a]
: SignedCertificate -> [SignedCertificate] -> [SignedCertificate]
findAuthorities SignedCertificate
c [SignedCertificate]
others'
([SignedCertificate], [SignedCertificate])
_ -> []
signedCert :: SignedCertificate -> Certificate
signedCert = Signed Certificate -> Certificate
forall a. (Show a, Eq a, ASN1Object a) => Signed a -> a
X509.signedObject (Signed Certificate -> Certificate)
-> (SignedCertificate -> Signed Certificate)
-> SignedCertificate
-> Certificate
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SignedCertificate -> Signed Certificate
forall a. (Show a, Eq a, ASN1Object a) => SignedExact a -> Signed a
X509.getSigned
subject :: SignedCertificate -> DistinguishedName
subject SignedCertificate
c = Certificate -> DistinguishedName
X509.certSubjectDN (SignedCertificate -> Certificate
signedCert SignedCertificate
c)
issuer :: SignedCertificate -> DistinguishedName
issuer SignedCertificate
c = Certificate -> DistinguishedName
X509.certIssuerDN (SignedCertificate -> Certificate
signedCert SignedCertificate
c)