{-# 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.QuickSight.Types.TableTotalsScrollStatus
-- 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.QuickSight.Types.TableTotalsScrollStatus
  ( TableTotalsScrollStatus
      ( ..,
        TableTotalsScrollStatus_PINNED,
        TableTotalsScrollStatus_SCROLLED
      ),
  )
where

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

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

pattern TableTotalsScrollStatus_PINNED :: TableTotalsScrollStatus
pattern $bTableTotalsScrollStatus_PINNED :: TableTotalsScrollStatus
$mTableTotalsScrollStatus_PINNED :: forall {r}.
TableTotalsScrollStatus -> ((# #) -> r) -> ((# #) -> r) -> r
TableTotalsScrollStatus_PINNED = TableTotalsScrollStatus' "PINNED"

pattern TableTotalsScrollStatus_SCROLLED :: TableTotalsScrollStatus
pattern $bTableTotalsScrollStatus_SCROLLED :: TableTotalsScrollStatus
$mTableTotalsScrollStatus_SCROLLED :: forall {r}.
TableTotalsScrollStatus -> ((# #) -> r) -> ((# #) -> r) -> r
TableTotalsScrollStatus_SCROLLED = TableTotalsScrollStatus' "SCROLLED"

{-# COMPLETE
  TableTotalsScrollStatus_PINNED,
  TableTotalsScrollStatus_SCROLLED,
  TableTotalsScrollStatus'
  #-}