{-# 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.PaperOrientation
-- 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.PaperOrientation
  ( PaperOrientation
      ( ..,
        PaperOrientation_LANDSCAPE,
        PaperOrientation_PORTRAIT
      ),
  )
where

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

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

pattern PaperOrientation_LANDSCAPE :: PaperOrientation
pattern $bPaperOrientation_LANDSCAPE :: PaperOrientation
$mPaperOrientation_LANDSCAPE :: forall {r}. PaperOrientation -> ((# #) -> r) -> ((# #) -> r) -> r
PaperOrientation_LANDSCAPE = PaperOrientation' "LANDSCAPE"

pattern PaperOrientation_PORTRAIT :: PaperOrientation
pattern $bPaperOrientation_PORTRAIT :: PaperOrientation
$mPaperOrientation_PORTRAIT :: forall {r}. PaperOrientation -> ((# #) -> r) -> ((# #) -> r) -> r
PaperOrientation_PORTRAIT = PaperOrientation' "PORTRAIT"

{-# COMPLETE
  PaperOrientation_LANDSCAPE,
  PaperOrientation_PORTRAIT,
  PaperOrientation'
  #-}