-- | Stability: experimental
-- This module contains additional Haskell-specific type definitions for the
-- [FIDO Metadata Statement](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html)
-- specification
module Crypto.WebAuthn.Metadata.Statement.Types
  ( MetadataStatement (..),
    WebauthnAttestationType (..),
  )
where

import qualified Crypto.WebAuthn.Metadata.FidoRegistry as Registry
import qualified Crypto.WebAuthn.Metadata.Statement.WebIDL as StatementIDL
import qualified Crypto.WebAuthn.Metadata.UAF as UAF
import Data.Aeson (ToJSON)
import qualified Data.ByteString as BS
import Data.List.NonEmpty (NonEmpty)
import Data.Text (Text)
import Data.Word (Word32)
import qualified Data.X509 as X509
import GHC.Generics (Generic)
import GHC.Word (Word16)

-- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#metadata-keys)
data MetadataStatement = MetadataStatement
  { -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-legalheader)
    MetadataStatement -> Text
msLegalHeader :: Text,
    -- msAaid, msAaguid, attestationCertificateKeyIdentifiers: These fields are the key of the hashmaps in MetadataServiceRegistry

    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-description)
    MetadataStatement -> Text
msDescription :: Text,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-alternativedescriptions)
    MetadataStatement -> Maybe AlternativeDescriptions
msAlternativeDescriptions :: Maybe StatementIDL.AlternativeDescriptions,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-authenticatorversion)
    MetadataStatement -> Word32
msAuthenticatorVersion :: Word32,
    -- protocolFamily, encoded as the type-level p
    -- msSchema, this is always schema version 3

    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-upv)
    MetadataStatement -> NonEmpty Version
msUpv :: NonEmpty UAF.Version,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-authenticationalgorithms)
    MetadataStatement -> NonEmpty AuthenticationAlgorithm
msAuthenticationAlgorithms :: NonEmpty Registry.AuthenticationAlgorithm,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-publickeyalgandencodings)
    MetadataStatement -> NonEmpty PublicKeyRepresentationFormat
msPublicKeyAlgAndEncodings :: NonEmpty Registry.PublicKeyRepresentationFormat,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-attestationtypes)
    MetadataStatement -> NonEmpty WebauthnAttestationType
msAttestationTypes :: NonEmpty WebauthnAttestationType,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-userverificationdetails)
    MetadataStatement -> NonEmpty VerificationMethodANDCombinations
msUserVerificationDetails :: NonEmpty StatementIDL.VerificationMethodANDCombinations,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-keyprotection)
    MetadataStatement -> NonEmpty KeyProtectionType
msKeyProtection :: NonEmpty Registry.KeyProtectionType,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-iskeyrestricted)
    MetadataStatement -> Maybe Bool
msIsKeyRestricted :: Maybe Bool,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-isfreshuserverificationrequired)
    MetadataStatement -> Maybe Bool
msIsFreshUserVerificationRequired :: Maybe Bool,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-matcherprotection)
    MetadataStatement -> NonEmpty MatcherProtectionType
msMatcherProtection :: NonEmpty Registry.MatcherProtectionType,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-cryptostrength)
    MetadataStatement -> Maybe Word16
msCryptoStrength :: Maybe Word16,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-attachmenthint)
    MetadataStatement -> NonEmpty AuthenticatorAttachmentHint
msAttachmentHint :: NonEmpty Registry.AuthenticatorAttachmentHint,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-tcdisplay)
    MetadataStatement -> [TransactionConfirmationDisplayType]
msTcDisplay :: [Registry.TransactionConfirmationDisplayType],
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-tcdisplaycontenttype)
    MetadataStatement -> Maybe Text
msTcDisplayContentType :: Maybe Text,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-tcdisplaypngcharacteristics)
    MetadataStatement
-> Maybe (NonEmpty DisplayPNGCharacteristicsDescriptor)
msTcDisplayPNGCharacteristics :: Maybe (NonEmpty StatementIDL.DisplayPNGCharacteristicsDescriptor),
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-attestationrootcertificates)
    MetadataStatement -> NonEmpty SignedCertificate
msAttestationRootCertificates :: NonEmpty X509.SignedCertificate,
    -- msEcdaaTrustAnchors, not needed for the subset we implement, FIDO 2 and FIDO U2F

    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-icon)
    MetadataStatement -> Maybe ByteString
msIcon :: Maybe BS.ByteString,
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-supportedextensions)
    MetadataStatement -> Maybe (NonEmpty ExtensionDescriptor)
msSupportedExtensions :: Maybe (NonEmpty StatementIDL.ExtensionDescriptor),
    -- | [(spec)](https://fidoalliance.org/specs/mds/fido-metadata-statement-v3.0-ps-20210518.html#dom-metadatastatement-authenticatorgetinfo)
    MetadataStatement -> Maybe AuthenticatorGetInfo
msAuthenticatorGetInfo :: Maybe StatementIDL.AuthenticatorGetInfo
  }
  deriving (MetadataStatement -> MetadataStatement -> Bool
(MetadataStatement -> MetadataStatement -> Bool)
-> (MetadataStatement -> MetadataStatement -> Bool)
-> Eq MetadataStatement
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: MetadataStatement -> MetadataStatement -> Bool
$c/= :: MetadataStatement -> MetadataStatement -> Bool
== :: MetadataStatement -> MetadataStatement -> Bool
$c== :: MetadataStatement -> MetadataStatement -> Bool
Eq, Int -> MetadataStatement -> ShowS
[MetadataStatement] -> ShowS
MetadataStatement -> String
(Int -> MetadataStatement -> ShowS)
-> (MetadataStatement -> String)
-> ([MetadataStatement] -> ShowS)
-> Show MetadataStatement
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [MetadataStatement] -> ShowS
$cshowList :: [MetadataStatement] -> ShowS
show :: MetadataStatement -> String
$cshow :: MetadataStatement -> String
showsPrec :: Int -> MetadataStatement -> ShowS
$cshowsPrec :: Int -> MetadataStatement -> ShowS
Show, (forall x. MetadataStatement -> Rep MetadataStatement x)
-> (forall x. Rep MetadataStatement x -> MetadataStatement)
-> Generic MetadataStatement
forall x. Rep MetadataStatement x -> MetadataStatement
forall x. MetadataStatement -> Rep MetadataStatement x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep MetadataStatement x -> MetadataStatement
$cfrom :: forall x. MetadataStatement -> Rep MetadataStatement x
Generic, [MetadataStatement] -> Encoding
[MetadataStatement] -> Value
MetadataStatement -> Encoding
MetadataStatement -> Value
(MetadataStatement -> Value)
-> (MetadataStatement -> Encoding)
-> ([MetadataStatement] -> Value)
-> ([MetadataStatement] -> Encoding)
-> ToJSON MetadataStatement
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
toEncodingList :: [MetadataStatement] -> Encoding
$ctoEncodingList :: [MetadataStatement] -> Encoding
toJSONList :: [MetadataStatement] -> Value
$ctoJSONList :: [MetadataStatement] -> Value
toEncoding :: MetadataStatement -> Encoding
$ctoEncoding :: MetadataStatement -> Encoding
toJSON :: MetadataStatement -> Value
$ctoJSON :: MetadataStatement -> Value
ToJSON)

-- | Values of 'Registry.AuthenticatorAttestationType' but limited to the ones possible with Webauthn, see https://www.w3.org/TR/webauthn-2/#sctn-attestation-types
data WebauthnAttestationType
  = WebauthnAttestationBasic
  | WebauthnAttestationAttCA
  deriving (WebauthnAttestationType -> WebauthnAttestationType -> Bool
(WebauthnAttestationType -> WebauthnAttestationType -> Bool)
-> (WebauthnAttestationType -> WebauthnAttestationType -> Bool)
-> Eq WebauthnAttestationType
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: WebauthnAttestationType -> WebauthnAttestationType -> Bool
$c/= :: WebauthnAttestationType -> WebauthnAttestationType -> Bool
== :: WebauthnAttestationType -> WebauthnAttestationType -> Bool
$c== :: WebauthnAttestationType -> WebauthnAttestationType -> Bool
Eq, Int -> WebauthnAttestationType -> ShowS
[WebauthnAttestationType] -> ShowS
WebauthnAttestationType -> String
(Int -> WebauthnAttestationType -> ShowS)
-> (WebauthnAttestationType -> String)
-> ([WebauthnAttestationType] -> ShowS)
-> Show WebauthnAttestationType
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [WebauthnAttestationType] -> ShowS
$cshowList :: [WebauthnAttestationType] -> ShowS
show :: WebauthnAttestationType -> String
$cshow :: WebauthnAttestationType -> String
showsPrec :: Int -> WebauthnAttestationType -> ShowS
$cshowsPrec :: Int -> WebauthnAttestationType -> ShowS
Show, (forall x.
 WebauthnAttestationType -> Rep WebauthnAttestationType x)
-> (forall x.
    Rep WebauthnAttestationType x -> WebauthnAttestationType)
-> Generic WebauthnAttestationType
forall x. Rep WebauthnAttestationType x -> WebauthnAttestationType
forall x. WebauthnAttestationType -> Rep WebauthnAttestationType x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep WebauthnAttestationType x -> WebauthnAttestationType
$cfrom :: forall x. WebauthnAttestationType -> Rep WebauthnAttestationType x
Generic, [WebauthnAttestationType] -> Encoding
[WebauthnAttestationType] -> Value
WebauthnAttestationType -> Encoding
WebauthnAttestationType -> Value
(WebauthnAttestationType -> Value)
-> (WebauthnAttestationType -> Encoding)
-> ([WebauthnAttestationType] -> Value)
-> ([WebauthnAttestationType] -> Encoding)
-> ToJSON WebauthnAttestationType
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
toEncodingList :: [WebauthnAttestationType] -> Encoding
$ctoEncodingList :: [WebauthnAttestationType] -> Encoding
toJSONList :: [WebauthnAttestationType] -> Value
$ctoJSONList :: [WebauthnAttestationType] -> Value
toEncoding :: WebauthnAttestationType -> Encoding
$ctoEncoding :: WebauthnAttestationType -> Encoding
toJSON :: WebauthnAttestationType -> Value
$ctoJSON :: WebauthnAttestationType -> Value
ToJSON)