{-# LANGUAGE DisambiguateRecordFields #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Amazonka.Signer.Waiters 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.DescribeSigningJob
import Amazonka.Signer.Lens
import Amazonka.Signer.Types
newSuccessfulSigningJob :: Core.Wait DescribeSigningJob
newSuccessfulSigningJob :: Wait DescribeSigningJob
newSuccessfulSigningJob =
Core.Wait
{ $sel:name:Wait :: ByteString
Core.name = ByteString
"SuccessfulSigningJob",
$sel:attempts:Wait :: Int
Core.attempts = Int
25,
$sel:delay:Wait :: Seconds
Core.delay = Seconds
20,
$sel:acceptors:Wait :: [Acceptor DescribeSigningJob]
Core.acceptors =
[ forall b a.
Eq b =>
b -> Accept -> Fold (AWSResponse a) b -> Acceptor a
Core.matchAll
CI Text
"Succeeded"
Accept
Core.AcceptSuccess
( Lens' DescribeSigningJobResponse (Maybe SigningStatus)
describeSigningJobResponse_status
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (p :: * -> * -> *) (f :: * -> *) s a.
(Profunctor p, Contravariant f) =>
(s -> a) -> Optic' p f s a
Lens.to forall a. ToText a => a -> CI Text
Data.toTextCI
),
forall b a.
Eq b =>
b -> Accept -> Fold (AWSResponse a) b -> Acceptor a
Core.matchAll
CI Text
"Failed"
Accept
Core.AcceptFailure
( Lens' DescribeSigningJobResponse (Maybe SigningStatus)
describeSigningJobResponse_status
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (p :: * -> * -> *) (f :: * -> *) s a.
(Profunctor p, Contravariant f) =>
(s -> a) -> Optic' p f s a
Lens.to forall a. ToText a => a -> CI Text
Data.toTextCI
),
forall a. ErrorCode -> Accept -> Acceptor a
Core.matchError
ErrorCode
"ResourceNotFoundException"
Accept
Core.AcceptFailure
]
}