{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.Signer.Types.SigningJob
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.Signer.Types.SigningJob where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import Amazonka.Signer.Types.SignedObject
import Amazonka.Signer.Types.SigningMaterial
import Amazonka.Signer.Types.SigningStatus
import Amazonka.Signer.Types.Source

-- | Contains information about a signing job.
--
-- /See:/ 'newSigningJob' smart constructor.
data SigningJob = SigningJob'
  { -- | The date and time that the signing job was created.
    SigningJob -> Maybe POSIX
createdAt :: Prelude.Maybe Data.POSIX,
    -- | Indicates whether the signing job is revoked.
    SigningJob -> Maybe Bool
isRevoked :: Prelude.Maybe Prelude.Bool,
    -- | The ID of the signing job.
    SigningJob -> Maybe Text
jobId :: Prelude.Maybe Prelude.Text,
    -- | The AWS account ID of the job invoker.
    SigningJob -> Maybe Text
jobInvoker :: Prelude.Maybe Prelude.Text,
    -- | The AWS account ID of the job owner.
    SigningJob -> Maybe Text
jobOwner :: Prelude.Maybe Prelude.Text,
    -- | The name of a signing platform.
    SigningJob -> Maybe Text
platformDisplayName :: Prelude.Maybe Prelude.Text,
    -- | The unique identifier for a signing platform.
    SigningJob -> Maybe Text
platformId :: Prelude.Maybe Prelude.Text,
    -- | The name of the signing profile that created a signing job.
    SigningJob -> Maybe Text
profileName :: Prelude.Maybe Prelude.Text,
    -- | The version of the signing profile that created a signing job.
    SigningJob -> Maybe Text
profileVersion :: Prelude.Maybe Prelude.Text,
    -- | The time when the signature of a signing job expires.
    SigningJob -> Maybe POSIX
signatureExpiresAt :: Prelude.Maybe Data.POSIX,
    -- | A @SignedObject@ structure that contains information about a signing
    -- job\'s signed code image.
    SigningJob -> Maybe SignedObject
signedObject :: Prelude.Maybe SignedObject,
    -- | A @SigningMaterial@ object that contains the Amazon Resource Name (ARN)
    -- of the certificate used for the signing job.
    SigningJob -> Maybe SigningMaterial
signingMaterial :: Prelude.Maybe SigningMaterial,
    -- | A @Source@ that contains information about a signing job\'s code image
    -- source.
    SigningJob -> Maybe Source
source :: Prelude.Maybe Source,
    -- | The status of the signing job.
    SigningJob -> Maybe SigningStatus
status :: Prelude.Maybe SigningStatus
  }
  deriving (SigningJob -> SigningJob -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SigningJob -> SigningJob -> Bool
$c/= :: SigningJob -> SigningJob -> Bool
== :: SigningJob -> SigningJob -> Bool
$c== :: SigningJob -> SigningJob -> Bool
Prelude.Eq, ReadPrec [SigningJob]
ReadPrec SigningJob
Int -> ReadS SigningJob
ReadS [SigningJob]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [SigningJob]
$creadListPrec :: ReadPrec [SigningJob]
readPrec :: ReadPrec SigningJob
$creadPrec :: ReadPrec SigningJob
readList :: ReadS [SigningJob]
$creadList :: ReadS [SigningJob]
readsPrec :: Int -> ReadS SigningJob
$creadsPrec :: Int -> ReadS SigningJob
Prelude.Read, Int -> SigningJob -> ShowS
[SigningJob] -> ShowS
SigningJob -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SigningJob] -> ShowS
$cshowList :: [SigningJob] -> ShowS
show :: SigningJob -> String
$cshow :: SigningJob -> String
showsPrec :: Int -> SigningJob -> ShowS
$cshowsPrec :: Int -> SigningJob -> ShowS
Prelude.Show, forall x. Rep SigningJob x -> SigningJob
forall x. SigningJob -> Rep SigningJob x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep SigningJob x -> SigningJob
$cfrom :: forall x. SigningJob -> Rep SigningJob x
Prelude.Generic)

-- |
-- Create a value of 'SigningJob' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'createdAt', 'signingJob_createdAt' - The date and time that the signing job was created.
--
-- 'isRevoked', 'signingJob_isRevoked' - Indicates whether the signing job is revoked.
--
-- 'jobId', 'signingJob_jobId' - The ID of the signing job.
--
-- 'jobInvoker', 'signingJob_jobInvoker' - The AWS account ID of the job invoker.
--
-- 'jobOwner', 'signingJob_jobOwner' - The AWS account ID of the job owner.
--
-- 'platformDisplayName', 'signingJob_platformDisplayName' - The name of a signing platform.
--
-- 'platformId', 'signingJob_platformId' - The unique identifier for a signing platform.
--
-- 'profileName', 'signingJob_profileName' - The name of the signing profile that created a signing job.
--
-- 'profileVersion', 'signingJob_profileVersion' - The version of the signing profile that created a signing job.
--
-- 'signatureExpiresAt', 'signingJob_signatureExpiresAt' - The time when the signature of a signing job expires.
--
-- 'signedObject', 'signingJob_signedObject' - A @SignedObject@ structure that contains information about a signing
-- job\'s signed code image.
--
-- 'signingMaterial', 'signingJob_signingMaterial' - A @SigningMaterial@ object that contains the Amazon Resource Name (ARN)
-- of the certificate used for the signing job.
--
-- 'source', 'signingJob_source' - A @Source@ that contains information about a signing job\'s code image
-- source.
--
-- 'status', 'signingJob_status' - The status of the signing job.
newSigningJob ::
  SigningJob
newSigningJob :: SigningJob
newSigningJob =
  SigningJob'
    { $sel:createdAt:SigningJob' :: Maybe POSIX
createdAt = forall a. Maybe a
Prelude.Nothing,
      $sel:isRevoked:SigningJob' :: Maybe Bool
isRevoked = forall a. Maybe a
Prelude.Nothing,
      $sel:jobId:SigningJob' :: Maybe Text
jobId = forall a. Maybe a
Prelude.Nothing,
      $sel:jobInvoker:SigningJob' :: Maybe Text
jobInvoker = forall a. Maybe a
Prelude.Nothing,
      $sel:jobOwner:SigningJob' :: Maybe Text
jobOwner = forall a. Maybe a
Prelude.Nothing,
      $sel:platformDisplayName:SigningJob' :: Maybe Text
platformDisplayName = forall a. Maybe a
Prelude.Nothing,
      $sel:platformId:SigningJob' :: Maybe Text
platformId = forall a. Maybe a
Prelude.Nothing,
      $sel:profileName:SigningJob' :: Maybe Text
profileName = forall a. Maybe a
Prelude.Nothing,
      $sel:profileVersion:SigningJob' :: Maybe Text
profileVersion = forall a. Maybe a
Prelude.Nothing,
      $sel:signatureExpiresAt:SigningJob' :: Maybe POSIX
signatureExpiresAt = forall a. Maybe a
Prelude.Nothing,
      $sel:signedObject:SigningJob' :: Maybe SignedObject
signedObject = forall a. Maybe a
Prelude.Nothing,
      $sel:signingMaterial:SigningJob' :: Maybe SigningMaterial
signingMaterial = forall a. Maybe a
Prelude.Nothing,
      $sel:source:SigningJob' :: Maybe Source
source = forall a. Maybe a
Prelude.Nothing,
      $sel:status:SigningJob' :: Maybe SigningStatus
status = forall a. Maybe a
Prelude.Nothing
    }

-- | The date and time that the signing job was created.
signingJob_createdAt :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.UTCTime)
signingJob_createdAt :: Lens' SigningJob (Maybe UTCTime)
signingJob_createdAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe POSIX
createdAt :: Maybe POSIX
$sel:createdAt:SigningJob' :: SigningJob -> Maybe POSIX
createdAt} -> Maybe POSIX
createdAt) (\s :: SigningJob
s@SigningJob' {} Maybe POSIX
a -> SigningJob
s {$sel:createdAt:SigningJob' :: Maybe POSIX
createdAt = Maybe POSIX
a} :: SigningJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | Indicates whether the signing job is revoked.
signingJob_isRevoked :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Bool)
signingJob_isRevoked :: Lens' SigningJob (Maybe Bool)
signingJob_isRevoked = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Bool
isRevoked :: Maybe Bool
$sel:isRevoked:SigningJob' :: SigningJob -> Maybe Bool
isRevoked} -> Maybe Bool
isRevoked) (\s :: SigningJob
s@SigningJob' {} Maybe Bool
a -> SigningJob
s {$sel:isRevoked:SigningJob' :: Maybe Bool
isRevoked = Maybe Bool
a} :: SigningJob)

-- | The ID of the signing job.
signingJob_jobId :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Text)
signingJob_jobId :: Lens' SigningJob (Maybe Text)
signingJob_jobId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Text
jobId :: Maybe Text
$sel:jobId:SigningJob' :: SigningJob -> Maybe Text
jobId} -> Maybe Text
jobId) (\s :: SigningJob
s@SigningJob' {} Maybe Text
a -> SigningJob
s {$sel:jobId:SigningJob' :: Maybe Text
jobId = Maybe Text
a} :: SigningJob)

-- | The AWS account ID of the job invoker.
signingJob_jobInvoker :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Text)
signingJob_jobInvoker :: Lens' SigningJob (Maybe Text)
signingJob_jobInvoker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Text
jobInvoker :: Maybe Text
$sel:jobInvoker:SigningJob' :: SigningJob -> Maybe Text
jobInvoker} -> Maybe Text
jobInvoker) (\s :: SigningJob
s@SigningJob' {} Maybe Text
a -> SigningJob
s {$sel:jobInvoker:SigningJob' :: Maybe Text
jobInvoker = Maybe Text
a} :: SigningJob)

-- | The AWS account ID of the job owner.
signingJob_jobOwner :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Text)
signingJob_jobOwner :: Lens' SigningJob (Maybe Text)
signingJob_jobOwner = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Text
jobOwner :: Maybe Text
$sel:jobOwner:SigningJob' :: SigningJob -> Maybe Text
jobOwner} -> Maybe Text
jobOwner) (\s :: SigningJob
s@SigningJob' {} Maybe Text
a -> SigningJob
s {$sel:jobOwner:SigningJob' :: Maybe Text
jobOwner = Maybe Text
a} :: SigningJob)

-- | The name of a signing platform.
signingJob_platformDisplayName :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Text)
signingJob_platformDisplayName :: Lens' SigningJob (Maybe Text)
signingJob_platformDisplayName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Text
platformDisplayName :: Maybe Text
$sel:platformDisplayName:SigningJob' :: SigningJob -> Maybe Text
platformDisplayName} -> Maybe Text
platformDisplayName) (\s :: SigningJob
s@SigningJob' {} Maybe Text
a -> SigningJob
s {$sel:platformDisplayName:SigningJob' :: Maybe Text
platformDisplayName = Maybe Text
a} :: SigningJob)

-- | The unique identifier for a signing platform.
signingJob_platformId :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Text)
signingJob_platformId :: Lens' SigningJob (Maybe Text)
signingJob_platformId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Text
platformId :: Maybe Text
$sel:platformId:SigningJob' :: SigningJob -> Maybe Text
platformId} -> Maybe Text
platformId) (\s :: SigningJob
s@SigningJob' {} Maybe Text
a -> SigningJob
s {$sel:platformId:SigningJob' :: Maybe Text
platformId = Maybe Text
a} :: SigningJob)

-- | The name of the signing profile that created a signing job.
signingJob_profileName :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Text)
signingJob_profileName :: Lens' SigningJob (Maybe Text)
signingJob_profileName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Text
profileName :: Maybe Text
$sel:profileName:SigningJob' :: SigningJob -> Maybe Text
profileName} -> Maybe Text
profileName) (\s :: SigningJob
s@SigningJob' {} Maybe Text
a -> SigningJob
s {$sel:profileName:SigningJob' :: Maybe Text
profileName = Maybe Text
a} :: SigningJob)

-- | The version of the signing profile that created a signing job.
signingJob_profileVersion :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.Text)
signingJob_profileVersion :: Lens' SigningJob (Maybe Text)
signingJob_profileVersion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Text
profileVersion :: Maybe Text
$sel:profileVersion:SigningJob' :: SigningJob -> Maybe Text
profileVersion} -> Maybe Text
profileVersion) (\s :: SigningJob
s@SigningJob' {} Maybe Text
a -> SigningJob
s {$sel:profileVersion:SigningJob' :: Maybe Text
profileVersion = Maybe Text
a} :: SigningJob)

-- | The time when the signature of a signing job expires.
signingJob_signatureExpiresAt :: Lens.Lens' SigningJob (Prelude.Maybe Prelude.UTCTime)
signingJob_signatureExpiresAt :: Lens' SigningJob (Maybe UTCTime)
signingJob_signatureExpiresAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe POSIX
signatureExpiresAt :: Maybe POSIX
$sel:signatureExpiresAt:SigningJob' :: SigningJob -> Maybe POSIX
signatureExpiresAt} -> Maybe POSIX
signatureExpiresAt) (\s :: SigningJob
s@SigningJob' {} Maybe POSIX
a -> SigningJob
s {$sel:signatureExpiresAt:SigningJob' :: Maybe POSIX
signatureExpiresAt = Maybe POSIX
a} :: SigningJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | A @SignedObject@ structure that contains information about a signing
-- job\'s signed code image.
signingJob_signedObject :: Lens.Lens' SigningJob (Prelude.Maybe SignedObject)
signingJob_signedObject :: Lens' SigningJob (Maybe SignedObject)
signingJob_signedObject = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe SignedObject
signedObject :: Maybe SignedObject
$sel:signedObject:SigningJob' :: SigningJob -> Maybe SignedObject
signedObject} -> Maybe SignedObject
signedObject) (\s :: SigningJob
s@SigningJob' {} Maybe SignedObject
a -> SigningJob
s {$sel:signedObject:SigningJob' :: Maybe SignedObject
signedObject = Maybe SignedObject
a} :: SigningJob)

-- | A @SigningMaterial@ object that contains the Amazon Resource Name (ARN)
-- of the certificate used for the signing job.
signingJob_signingMaterial :: Lens.Lens' SigningJob (Prelude.Maybe SigningMaterial)
signingJob_signingMaterial :: Lens' SigningJob (Maybe SigningMaterial)
signingJob_signingMaterial = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe SigningMaterial
signingMaterial :: Maybe SigningMaterial
$sel:signingMaterial:SigningJob' :: SigningJob -> Maybe SigningMaterial
signingMaterial} -> Maybe SigningMaterial
signingMaterial) (\s :: SigningJob
s@SigningJob' {} Maybe SigningMaterial
a -> SigningJob
s {$sel:signingMaterial:SigningJob' :: Maybe SigningMaterial
signingMaterial = Maybe SigningMaterial
a} :: SigningJob)

-- | A @Source@ that contains information about a signing job\'s code image
-- source.
signingJob_source :: Lens.Lens' SigningJob (Prelude.Maybe Source)
signingJob_source :: Lens' SigningJob (Maybe Source)
signingJob_source = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe Source
source :: Maybe Source
$sel:source:SigningJob' :: SigningJob -> Maybe Source
source} -> Maybe Source
source) (\s :: SigningJob
s@SigningJob' {} Maybe Source
a -> SigningJob
s {$sel:source:SigningJob' :: Maybe Source
source = Maybe Source
a} :: SigningJob)

-- | The status of the signing job.
signingJob_status :: Lens.Lens' SigningJob (Prelude.Maybe SigningStatus)
signingJob_status :: Lens' SigningJob (Maybe SigningStatus)
signingJob_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SigningJob' {Maybe SigningStatus
status :: Maybe SigningStatus
$sel:status:SigningJob' :: SigningJob -> Maybe SigningStatus
status} -> Maybe SigningStatus
status) (\s :: SigningJob
s@SigningJob' {} Maybe SigningStatus
a -> SigningJob
s {$sel:status:SigningJob' :: Maybe SigningStatus
status = Maybe SigningStatus
a} :: SigningJob)

instance Data.FromJSON SigningJob where
  parseJSON :: Value -> Parser SigningJob
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"SigningJob"
      ( \Object
x ->
          Maybe POSIX
-> Maybe Bool
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe POSIX
-> Maybe SignedObject
-> Maybe SigningMaterial
-> Maybe Source
-> Maybe SigningStatus
-> SigningJob
SigningJob'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"createdAt")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"isRevoked")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"jobId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"jobInvoker")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"jobOwner")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"platformDisplayName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"platformId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"profileName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"profileVersion")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"signatureExpiresAt")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"signedObject")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"signingMaterial")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"source")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"status")
      )

instance Prelude.Hashable SigningJob where
  hashWithSalt :: Int -> SigningJob -> Int
hashWithSalt Int
_salt SigningJob' {Maybe Bool
Maybe Text
Maybe POSIX
Maybe SignedObject
Maybe SigningMaterial
Maybe SigningStatus
Maybe Source
status :: Maybe SigningStatus
source :: Maybe Source
signingMaterial :: Maybe SigningMaterial
signedObject :: Maybe SignedObject
signatureExpiresAt :: Maybe POSIX
profileVersion :: Maybe Text
profileName :: Maybe Text
platformId :: Maybe Text
platformDisplayName :: Maybe Text
jobOwner :: Maybe Text
jobInvoker :: Maybe Text
jobId :: Maybe Text
isRevoked :: Maybe Bool
createdAt :: Maybe POSIX
$sel:status:SigningJob' :: SigningJob -> Maybe SigningStatus
$sel:source:SigningJob' :: SigningJob -> Maybe Source
$sel:signingMaterial:SigningJob' :: SigningJob -> Maybe SigningMaterial
$sel:signedObject:SigningJob' :: SigningJob -> Maybe SignedObject
$sel:signatureExpiresAt:SigningJob' :: SigningJob -> Maybe POSIX
$sel:profileVersion:SigningJob' :: SigningJob -> Maybe Text
$sel:profileName:SigningJob' :: SigningJob -> Maybe Text
$sel:platformId:SigningJob' :: SigningJob -> Maybe Text
$sel:platformDisplayName:SigningJob' :: SigningJob -> Maybe Text
$sel:jobOwner:SigningJob' :: SigningJob -> Maybe Text
$sel:jobInvoker:SigningJob' :: SigningJob -> Maybe Text
$sel:jobId:SigningJob' :: SigningJob -> Maybe Text
$sel:isRevoked:SigningJob' :: SigningJob -> Maybe Bool
$sel:createdAt:SigningJob' :: SigningJob -> Maybe POSIX
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
createdAt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
isRevoked
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
jobId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
jobInvoker
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
jobOwner
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
platformDisplayName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
platformId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
profileName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
profileVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
signatureExpiresAt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe SignedObject
signedObject
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe SigningMaterial
signingMaterial
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Source
source
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe SigningStatus
status

instance Prelude.NFData SigningJob where
  rnf :: SigningJob -> ()
rnf SigningJob' {Maybe Bool
Maybe Text
Maybe POSIX
Maybe SignedObject
Maybe SigningMaterial
Maybe SigningStatus
Maybe Source
status :: Maybe SigningStatus
source :: Maybe Source
signingMaterial :: Maybe SigningMaterial
signedObject :: Maybe SignedObject
signatureExpiresAt :: Maybe POSIX
profileVersion :: Maybe Text
profileName :: Maybe Text
platformId :: Maybe Text
platformDisplayName :: Maybe Text
jobOwner :: Maybe Text
jobInvoker :: Maybe Text
jobId :: Maybe Text
isRevoked :: Maybe Bool
createdAt :: Maybe POSIX
$sel:status:SigningJob' :: SigningJob -> Maybe SigningStatus
$sel:source:SigningJob' :: SigningJob -> Maybe Source
$sel:signingMaterial:SigningJob' :: SigningJob -> Maybe SigningMaterial
$sel:signedObject:SigningJob' :: SigningJob -> Maybe SignedObject
$sel:signatureExpiresAt:SigningJob' :: SigningJob -> Maybe POSIX
$sel:profileVersion:SigningJob' :: SigningJob -> Maybe Text
$sel:profileName:SigningJob' :: SigningJob -> Maybe Text
$sel:platformId:SigningJob' :: SigningJob -> Maybe Text
$sel:platformDisplayName:SigningJob' :: SigningJob -> Maybe Text
$sel:jobOwner:SigningJob' :: SigningJob -> Maybe Text
$sel:jobInvoker:SigningJob' :: SigningJob -> Maybe Text
$sel:jobId:SigningJob' :: SigningJob -> Maybe Text
$sel:isRevoked:SigningJob' :: SigningJob -> Maybe Bool
$sel:createdAt:SigningJob' :: SigningJob -> Maybe POSIX
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
createdAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
isRevoked
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
jobId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
jobInvoker
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
jobOwner
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
platformDisplayName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
platformId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
profileName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
profileVersion
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
signatureExpiresAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SignedObject
signedObject
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SigningMaterial
signingMaterial
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Source
source
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SigningStatus
status