{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DerivingStrategies #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}

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

-- |
-- Module      : Amazonka.TimeStreamQuery.Types.ScheduledQueryRunStatus
-- 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.TimeStreamQuery.Types.ScheduledQueryRunStatus
  ( ScheduledQueryRunStatus
      ( ..,
        ScheduledQueryRunStatus_AUTO_TRIGGER_FAILURE,
        ScheduledQueryRunStatus_AUTO_TRIGGER_SUCCESS,
        ScheduledQueryRunStatus_MANUAL_TRIGGER_FAILURE,
        ScheduledQueryRunStatus_MANUAL_TRIGGER_SUCCESS
      ),
  )
where

import qualified Amazonka.Core as Core
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude

newtype ScheduledQueryRunStatus = ScheduledQueryRunStatus'
  { ScheduledQueryRunStatus -> Text
fromScheduledQueryRunStatus ::
      Data.Text
  }
  deriving stock
    ( Int -> ScheduledQueryRunStatus -> ShowS
[ScheduledQueryRunStatus] -> ShowS
ScheduledQueryRunStatus -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ScheduledQueryRunStatus] -> ShowS
$cshowList :: [ScheduledQueryRunStatus] -> ShowS
show :: ScheduledQueryRunStatus -> String
$cshow :: ScheduledQueryRunStatus -> String
showsPrec :: Int -> ScheduledQueryRunStatus -> ShowS
$cshowsPrec :: Int -> ScheduledQueryRunStatus -> ShowS
Prelude.Show,
      ReadPrec [ScheduledQueryRunStatus]
ReadPrec ScheduledQueryRunStatus
Int -> ReadS ScheduledQueryRunStatus
ReadS [ScheduledQueryRunStatus]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ScheduledQueryRunStatus]
$creadListPrec :: ReadPrec [ScheduledQueryRunStatus]
readPrec :: ReadPrec ScheduledQueryRunStatus
$creadPrec :: ReadPrec ScheduledQueryRunStatus
readList :: ReadS [ScheduledQueryRunStatus]
$creadList :: ReadS [ScheduledQueryRunStatus]
readsPrec :: Int -> ReadS ScheduledQueryRunStatus
$creadsPrec :: Int -> ReadS ScheduledQueryRunStatus
Prelude.Read,
      ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
$c/= :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
== :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
$c== :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
Prelude.Eq,
      Eq ScheduledQueryRunStatus
ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Ordering
ScheduledQueryRunStatus
-> ScheduledQueryRunStatus -> ScheduledQueryRunStatus
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: ScheduledQueryRunStatus
-> ScheduledQueryRunStatus -> ScheduledQueryRunStatus
$cmin :: ScheduledQueryRunStatus
-> ScheduledQueryRunStatus -> ScheduledQueryRunStatus
max :: ScheduledQueryRunStatus
-> ScheduledQueryRunStatus -> ScheduledQueryRunStatus
$cmax :: ScheduledQueryRunStatus
-> ScheduledQueryRunStatus -> ScheduledQueryRunStatus
>= :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
$c>= :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
> :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
$c> :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
<= :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
$c<= :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
< :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
$c< :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Bool
compare :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Ordering
$ccompare :: ScheduledQueryRunStatus -> ScheduledQueryRunStatus -> Ordering
Prelude.Ord,
      forall x. Rep ScheduledQueryRunStatus x -> ScheduledQueryRunStatus
forall x. ScheduledQueryRunStatus -> Rep ScheduledQueryRunStatus x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ScheduledQueryRunStatus x -> ScheduledQueryRunStatus
$cfrom :: forall x. ScheduledQueryRunStatus -> Rep ScheduledQueryRunStatus x
Prelude.Generic
    )
  deriving newtype
    ( Eq ScheduledQueryRunStatus
Int -> ScheduledQueryRunStatus -> Int
ScheduledQueryRunStatus -> Int
forall a. Eq a -> (Int -> a -> Int) -> (a -> Int) -> Hashable a
hash :: ScheduledQueryRunStatus -> Int
$chash :: ScheduledQueryRunStatus -> Int
hashWithSalt :: Int -> ScheduledQueryRunStatus -> Int
$chashWithSalt :: Int -> ScheduledQueryRunStatus -> Int
Prelude.Hashable,
      ScheduledQueryRunStatus -> ()
forall a. (a -> ()) -> NFData a
rnf :: ScheduledQueryRunStatus -> ()
$crnf :: ScheduledQueryRunStatus -> ()
Prelude.NFData,
      Text -> Either String ScheduledQueryRunStatus
forall a. (Text -> Either String a) -> FromText a
fromText :: Text -> Either String ScheduledQueryRunStatus
$cfromText :: Text -> Either String ScheduledQueryRunStatus
Data.FromText,
      ScheduledQueryRunStatus -> Text
forall a. (a -> Text) -> ToText a
toText :: ScheduledQueryRunStatus -> Text
$ctoText :: ScheduledQueryRunStatus -> Text
Data.ToText,
      ScheduledQueryRunStatus -> ByteString
forall a. (a -> ByteString) -> ToByteString a
toBS :: ScheduledQueryRunStatus -> ByteString
$ctoBS :: ScheduledQueryRunStatus -> ByteString
Data.ToByteString,
      ScheduledQueryRunStatus -> ByteStringBuilder
forall a. (a -> ByteStringBuilder) -> ToLog a
build :: ScheduledQueryRunStatus -> ByteStringBuilder
$cbuild :: ScheduledQueryRunStatus -> ByteStringBuilder
Data.ToLog,
      HeaderName -> ScheduledQueryRunStatus -> [Header]
forall a. (HeaderName -> a -> [Header]) -> ToHeader a
toHeader :: HeaderName -> ScheduledQueryRunStatus -> [Header]
$ctoHeader :: HeaderName -> ScheduledQueryRunStatus -> [Header]
Data.ToHeader,
      ScheduledQueryRunStatus -> QueryString
forall a. (a -> QueryString) -> ToQuery a
toQuery :: ScheduledQueryRunStatus -> QueryString
$ctoQuery :: ScheduledQueryRunStatus -> QueryString
Data.ToQuery,
      Value -> Parser [ScheduledQueryRunStatus]
Value -> Parser ScheduledQueryRunStatus
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
parseJSONList :: Value -> Parser [ScheduledQueryRunStatus]
$cparseJSONList :: Value -> Parser [ScheduledQueryRunStatus]
parseJSON :: Value -> Parser ScheduledQueryRunStatus
$cparseJSON :: Value -> Parser ScheduledQueryRunStatus
Data.FromJSON,
      FromJSONKeyFunction [ScheduledQueryRunStatus]
FromJSONKeyFunction ScheduledQueryRunStatus
forall a.
FromJSONKeyFunction a -> FromJSONKeyFunction [a] -> FromJSONKey a
fromJSONKeyList :: FromJSONKeyFunction [ScheduledQueryRunStatus]
$cfromJSONKeyList :: FromJSONKeyFunction [ScheduledQueryRunStatus]
fromJSONKey :: FromJSONKeyFunction ScheduledQueryRunStatus
$cfromJSONKey :: FromJSONKeyFunction ScheduledQueryRunStatus
Data.FromJSONKey,
      [ScheduledQueryRunStatus] -> Encoding
[ScheduledQueryRunStatus] -> Value
ScheduledQueryRunStatus -> Encoding
ScheduledQueryRunStatus -> Value
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
toEncodingList :: [ScheduledQueryRunStatus] -> Encoding
$ctoEncodingList :: [ScheduledQueryRunStatus] -> Encoding
toJSONList :: [ScheduledQueryRunStatus] -> Value
$ctoJSONList :: [ScheduledQueryRunStatus] -> Value
toEncoding :: ScheduledQueryRunStatus -> Encoding
$ctoEncoding :: ScheduledQueryRunStatus -> Encoding
toJSON :: ScheduledQueryRunStatus -> Value
$ctoJSON :: ScheduledQueryRunStatus -> Value
Data.ToJSON,
      ToJSONKeyFunction [ScheduledQueryRunStatus]
ToJSONKeyFunction ScheduledQueryRunStatus
forall a.
ToJSONKeyFunction a -> ToJSONKeyFunction [a] -> ToJSONKey a
toJSONKeyList :: ToJSONKeyFunction [ScheduledQueryRunStatus]
$ctoJSONKeyList :: ToJSONKeyFunction [ScheduledQueryRunStatus]
toJSONKey :: ToJSONKeyFunction ScheduledQueryRunStatus
$ctoJSONKey :: ToJSONKeyFunction ScheduledQueryRunStatus
Data.ToJSONKey,
      [Node] -> Either String ScheduledQueryRunStatus
forall a. ([Node] -> Either String a) -> FromXML a
parseXML :: [Node] -> Either String ScheduledQueryRunStatus
$cparseXML :: [Node] -> Either String ScheduledQueryRunStatus
Data.FromXML,
      ScheduledQueryRunStatus -> XML
forall a. (a -> XML) -> ToXML a
toXML :: ScheduledQueryRunStatus -> XML
$ctoXML :: ScheduledQueryRunStatus -> XML
Data.ToXML
    )

pattern ScheduledQueryRunStatus_AUTO_TRIGGER_FAILURE :: ScheduledQueryRunStatus
pattern $bScheduledQueryRunStatus_AUTO_TRIGGER_FAILURE :: ScheduledQueryRunStatus
$mScheduledQueryRunStatus_AUTO_TRIGGER_FAILURE :: forall {r}.
ScheduledQueryRunStatus -> ((# #) -> r) -> ((# #) -> r) -> r
ScheduledQueryRunStatus_AUTO_TRIGGER_FAILURE = ScheduledQueryRunStatus' "AUTO_TRIGGER_FAILURE"

pattern ScheduledQueryRunStatus_AUTO_TRIGGER_SUCCESS :: ScheduledQueryRunStatus
pattern $bScheduledQueryRunStatus_AUTO_TRIGGER_SUCCESS :: ScheduledQueryRunStatus
$mScheduledQueryRunStatus_AUTO_TRIGGER_SUCCESS :: forall {r}.
ScheduledQueryRunStatus -> ((# #) -> r) -> ((# #) -> r) -> r
ScheduledQueryRunStatus_AUTO_TRIGGER_SUCCESS = ScheduledQueryRunStatus' "AUTO_TRIGGER_SUCCESS"

pattern ScheduledQueryRunStatus_MANUAL_TRIGGER_FAILURE :: ScheduledQueryRunStatus
pattern $bScheduledQueryRunStatus_MANUAL_TRIGGER_FAILURE :: ScheduledQueryRunStatus
$mScheduledQueryRunStatus_MANUAL_TRIGGER_FAILURE :: forall {r}.
ScheduledQueryRunStatus -> ((# #) -> r) -> ((# #) -> r) -> r
ScheduledQueryRunStatus_MANUAL_TRIGGER_FAILURE = ScheduledQueryRunStatus' "MANUAL_TRIGGER_FAILURE"

pattern ScheduledQueryRunStatus_MANUAL_TRIGGER_SUCCESS :: ScheduledQueryRunStatus
pattern $bScheduledQueryRunStatus_MANUAL_TRIGGER_SUCCESS :: ScheduledQueryRunStatus
$mScheduledQueryRunStatus_MANUAL_TRIGGER_SUCCESS :: forall {r}.
ScheduledQueryRunStatus -> ((# #) -> r) -> ((# #) -> r) -> r
ScheduledQueryRunStatus_MANUAL_TRIGGER_SUCCESS = ScheduledQueryRunStatus' "MANUAL_TRIGGER_SUCCESS"

{-# COMPLETE
  ScheduledQueryRunStatus_AUTO_TRIGGER_FAILURE,
  ScheduledQueryRunStatus_AUTO_TRIGGER_SUCCESS,
  ScheduledQueryRunStatus_MANUAL_TRIGGER_FAILURE,
  ScheduledQueryRunStatus_MANUAL_TRIGGER_SUCCESS,
  ScheduledQueryRunStatus'
  #-}