{-# 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.BaseMapStyleType
-- 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.BaseMapStyleType
  ( BaseMapStyleType
      ( ..,
        BaseMapStyleType_DARK_GRAY,
        BaseMapStyleType_IMAGERY,
        BaseMapStyleType_LIGHT_GRAY,
        BaseMapStyleType_STREET
      ),
  )
where

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

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

pattern BaseMapStyleType_DARK_GRAY :: BaseMapStyleType
pattern $bBaseMapStyleType_DARK_GRAY :: BaseMapStyleType
$mBaseMapStyleType_DARK_GRAY :: forall {r}. BaseMapStyleType -> ((# #) -> r) -> ((# #) -> r) -> r
BaseMapStyleType_DARK_GRAY = BaseMapStyleType' "DARK_GRAY"

pattern BaseMapStyleType_IMAGERY :: BaseMapStyleType
pattern $bBaseMapStyleType_IMAGERY :: BaseMapStyleType
$mBaseMapStyleType_IMAGERY :: forall {r}. BaseMapStyleType -> ((# #) -> r) -> ((# #) -> r) -> r
BaseMapStyleType_IMAGERY = BaseMapStyleType' "IMAGERY"

pattern BaseMapStyleType_LIGHT_GRAY :: BaseMapStyleType
pattern $bBaseMapStyleType_LIGHT_GRAY :: BaseMapStyleType
$mBaseMapStyleType_LIGHT_GRAY :: forall {r}. BaseMapStyleType -> ((# #) -> r) -> ((# #) -> r) -> r
BaseMapStyleType_LIGHT_GRAY = BaseMapStyleType' "LIGHT_GRAY"

pattern BaseMapStyleType_STREET :: BaseMapStyleType
pattern $bBaseMapStyleType_STREET :: BaseMapStyleType
$mBaseMapStyleType_STREET :: forall {r}. BaseMapStyleType -> ((# #) -> r) -> ((# #) -> r) -> r
BaseMapStyleType_STREET = BaseMapStyleType' "STREET"

{-# COMPLETE
  BaseMapStyleType_DARK_GRAY,
  BaseMapStyleType_IMAGERY,
  BaseMapStyleType_LIGHT_GRAY,
  BaseMapStyleType_STREET,
  BaseMapStyleType'
  #-}