{-# 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.BoxPlotFillStyle
-- 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.BoxPlotFillStyle
  ( BoxPlotFillStyle
      ( ..,
        BoxPlotFillStyle_SOLID,
        BoxPlotFillStyle_TRANSPARENT
      ),
  )
where

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

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

pattern BoxPlotFillStyle_SOLID :: BoxPlotFillStyle
pattern $bBoxPlotFillStyle_SOLID :: BoxPlotFillStyle
$mBoxPlotFillStyle_SOLID :: forall {r}. BoxPlotFillStyle -> ((# #) -> r) -> ((# #) -> r) -> r
BoxPlotFillStyle_SOLID = BoxPlotFillStyle' "SOLID"

pattern BoxPlotFillStyle_TRANSPARENT :: BoxPlotFillStyle
pattern $bBoxPlotFillStyle_TRANSPARENT :: BoxPlotFillStyle
$mBoxPlotFillStyle_TRANSPARENT :: forall {r}. BoxPlotFillStyle -> ((# #) -> r) -> ((# #) -> r) -> r
BoxPlotFillStyle_TRANSPARENT = BoxPlotFillStyle' "TRANSPARENT"

{-# COMPLETE
  BoxPlotFillStyle_SOLID,
  BoxPlotFillStyle_TRANSPARENT,
  BoxPlotFillStyle'
  #-}