{-# 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.Kendra.Types.ConfluencePageFieldName
-- 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.Kendra.Types.ConfluencePageFieldName
  ( ConfluencePageFieldName
      ( ..,
        ConfluencePageFieldName_AUTHOR,
        ConfluencePageFieldName_CONTENT_STATUS,
        ConfluencePageFieldName_CREATED_DATE,
        ConfluencePageFieldName_DISPLAY_URL,
        ConfluencePageFieldName_ITEM_TYPE,
        ConfluencePageFieldName_LABELS,
        ConfluencePageFieldName_MODIFIED_DATE,
        ConfluencePageFieldName_PARENT_ID,
        ConfluencePageFieldName_SPACE_KEY,
        ConfluencePageFieldName_SPACE_NAME,
        ConfluencePageFieldName_URL,
        ConfluencePageFieldName_VERSION
      ),
  )
where

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

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

pattern ConfluencePageFieldName_AUTHOR :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_AUTHOR :: ConfluencePageFieldName
$mConfluencePageFieldName_AUTHOR :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_AUTHOR = ConfluencePageFieldName' "AUTHOR"

pattern ConfluencePageFieldName_CONTENT_STATUS :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_CONTENT_STATUS :: ConfluencePageFieldName
$mConfluencePageFieldName_CONTENT_STATUS :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_CONTENT_STATUS = ConfluencePageFieldName' "CONTENT_STATUS"

pattern ConfluencePageFieldName_CREATED_DATE :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_CREATED_DATE :: ConfluencePageFieldName
$mConfluencePageFieldName_CREATED_DATE :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_CREATED_DATE = ConfluencePageFieldName' "CREATED_DATE"

pattern ConfluencePageFieldName_DISPLAY_URL :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_DISPLAY_URL :: ConfluencePageFieldName
$mConfluencePageFieldName_DISPLAY_URL :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_DISPLAY_URL = ConfluencePageFieldName' "DISPLAY_URL"

pattern ConfluencePageFieldName_ITEM_TYPE :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_ITEM_TYPE :: ConfluencePageFieldName
$mConfluencePageFieldName_ITEM_TYPE :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_ITEM_TYPE = ConfluencePageFieldName' "ITEM_TYPE"

pattern ConfluencePageFieldName_LABELS :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_LABELS :: ConfluencePageFieldName
$mConfluencePageFieldName_LABELS :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_LABELS = ConfluencePageFieldName' "LABELS"

pattern ConfluencePageFieldName_MODIFIED_DATE :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_MODIFIED_DATE :: ConfluencePageFieldName
$mConfluencePageFieldName_MODIFIED_DATE :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_MODIFIED_DATE = ConfluencePageFieldName' "MODIFIED_DATE"

pattern ConfluencePageFieldName_PARENT_ID :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_PARENT_ID :: ConfluencePageFieldName
$mConfluencePageFieldName_PARENT_ID :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_PARENT_ID = ConfluencePageFieldName' "PARENT_ID"

pattern ConfluencePageFieldName_SPACE_KEY :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_SPACE_KEY :: ConfluencePageFieldName
$mConfluencePageFieldName_SPACE_KEY :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_SPACE_KEY = ConfluencePageFieldName' "SPACE_KEY"

pattern ConfluencePageFieldName_SPACE_NAME :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_SPACE_NAME :: ConfluencePageFieldName
$mConfluencePageFieldName_SPACE_NAME :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_SPACE_NAME = ConfluencePageFieldName' "SPACE_NAME"

pattern ConfluencePageFieldName_URL :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_URL :: ConfluencePageFieldName
$mConfluencePageFieldName_URL :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_URL = ConfluencePageFieldName' "URL"

pattern ConfluencePageFieldName_VERSION :: ConfluencePageFieldName
pattern $bConfluencePageFieldName_VERSION :: ConfluencePageFieldName
$mConfluencePageFieldName_VERSION :: forall {r}.
ConfluencePageFieldName -> ((# #) -> r) -> ((# #) -> r) -> r
ConfluencePageFieldName_VERSION = ConfluencePageFieldName' "VERSION"

{-# COMPLETE
  ConfluencePageFieldName_AUTHOR,
  ConfluencePageFieldName_CONTENT_STATUS,
  ConfluencePageFieldName_CREATED_DATE,
  ConfluencePageFieldName_DISPLAY_URL,
  ConfluencePageFieldName_ITEM_TYPE,
  ConfluencePageFieldName_LABELS,
  ConfluencePageFieldName_MODIFIED_DATE,
  ConfluencePageFieldName_PARENT_ID,
  ConfluencePageFieldName_SPACE_KEY,
  ConfluencePageFieldName_SPACE_NAME,
  ConfluencePageFieldName_URL,
  ConfluencePageFieldName_VERSION,
  ConfluencePageFieldName'
  #-}