{-# 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.ChimeSdkVoice.Types.AlexaSkillStatus
-- 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.ChimeSdkVoice.Types.AlexaSkillStatus
  ( AlexaSkillStatus
      ( ..,
        AlexaSkillStatus_ACTIVE,
        AlexaSkillStatus_INACTIVE
      ),
  )
where

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

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

pattern AlexaSkillStatus_ACTIVE :: AlexaSkillStatus
pattern $bAlexaSkillStatus_ACTIVE :: AlexaSkillStatus
$mAlexaSkillStatus_ACTIVE :: forall {r}. AlexaSkillStatus -> ((# #) -> r) -> ((# #) -> r) -> r
AlexaSkillStatus_ACTIVE = AlexaSkillStatus' "ACTIVE"

pattern AlexaSkillStatus_INACTIVE :: AlexaSkillStatus
pattern $bAlexaSkillStatus_INACTIVE :: AlexaSkillStatus
$mAlexaSkillStatus_INACTIVE :: forall {r}. AlexaSkillStatus -> ((# #) -> r) -> ((# #) -> r) -> r
AlexaSkillStatus_INACTIVE = AlexaSkillStatus' "INACTIVE"

{-# COMPLETE
  AlexaSkillStatus_ACTIVE,
  AlexaSkillStatus_INACTIVE,
  AlexaSkillStatus'
  #-}