{-# 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.PinpointSmsVoiceV2.Types.VoiceId
-- 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.PinpointSmsVoiceV2.Types.VoiceId
  ( VoiceId
      ( ..,
        VoiceId_AMY,
        VoiceId_ASTRID,
        VoiceId_BIANCA,
        VoiceId_BRIAN,
        VoiceId_CAMILA,
        VoiceId_CARLA,
        VoiceId_CARMEN,
        VoiceId_CELINE,
        VoiceId_CHANTAL,
        VoiceId_CONCHITA,
        VoiceId_CRISTIANO,
        VoiceId_DORA,
        VoiceId_EMMA,
        VoiceId_ENRIQUE,
        VoiceId_EWA,
        VoiceId_FILIZ,
        VoiceId_GERAINT,
        VoiceId_GIORGIO,
        VoiceId_GWYNETH,
        VoiceId_HANS,
        VoiceId_INES,
        VoiceId_IVY,
        VoiceId_JACEK,
        VoiceId_JAN,
        VoiceId_JOANNA,
        VoiceId_JOEY,
        VoiceId_JUSTIN,
        VoiceId_KARL,
        VoiceId_KENDRA,
        VoiceId_KIMBERLY,
        VoiceId_LEA,
        VoiceId_LIV,
        VoiceId_LOTTE,
        VoiceId_LUCIA,
        VoiceId_LUPE,
        VoiceId_MADS,
        VoiceId_MAJA,
        VoiceId_MARLENE,
        VoiceId_MATHIEU,
        VoiceId_MATTHEW,
        VoiceId_MAXIM,
        VoiceId_MIA,
        VoiceId_MIGUEL,
        VoiceId_MIZUKI,
        VoiceId_NAJA,
        VoiceId_NICOLE,
        VoiceId_PENELOPE,
        VoiceId_RAVEENA,
        VoiceId_RICARDO,
        VoiceId_RUBEN,
        VoiceId_RUSSELL,
        VoiceId_SALLI,
        VoiceId_SEOYEON,
        VoiceId_TAKUMI,
        VoiceId_TATYANA,
        VoiceId_VICKI,
        VoiceId_VITORIA,
        VoiceId_ZEINA,
        VoiceId_ZHIYU
      ),
  )
where

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

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

pattern VoiceId_AMY :: VoiceId
pattern $bVoiceId_AMY :: VoiceId
$mVoiceId_AMY :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_AMY = VoiceId' "AMY"

pattern VoiceId_ASTRID :: VoiceId
pattern $bVoiceId_ASTRID :: VoiceId
$mVoiceId_ASTRID :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_ASTRID = VoiceId' "ASTRID"

pattern VoiceId_BIANCA :: VoiceId
pattern $bVoiceId_BIANCA :: VoiceId
$mVoiceId_BIANCA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_BIANCA = VoiceId' "BIANCA"

pattern VoiceId_BRIAN :: VoiceId
pattern $bVoiceId_BRIAN :: VoiceId
$mVoiceId_BRIAN :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_BRIAN = VoiceId' "BRIAN"

pattern VoiceId_CAMILA :: VoiceId
pattern $bVoiceId_CAMILA :: VoiceId
$mVoiceId_CAMILA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_CAMILA = VoiceId' "CAMILA"

pattern VoiceId_CARLA :: VoiceId
pattern $bVoiceId_CARLA :: VoiceId
$mVoiceId_CARLA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_CARLA = VoiceId' "CARLA"

pattern VoiceId_CARMEN :: VoiceId
pattern $bVoiceId_CARMEN :: VoiceId
$mVoiceId_CARMEN :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_CARMEN = VoiceId' "CARMEN"

pattern VoiceId_CELINE :: VoiceId
pattern $bVoiceId_CELINE :: VoiceId
$mVoiceId_CELINE :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_CELINE = VoiceId' "CELINE"

pattern VoiceId_CHANTAL :: VoiceId
pattern $bVoiceId_CHANTAL :: VoiceId
$mVoiceId_CHANTAL :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_CHANTAL = VoiceId' "CHANTAL"

pattern VoiceId_CONCHITA :: VoiceId
pattern $bVoiceId_CONCHITA :: VoiceId
$mVoiceId_CONCHITA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_CONCHITA = VoiceId' "CONCHITA"

pattern VoiceId_CRISTIANO :: VoiceId
pattern $bVoiceId_CRISTIANO :: VoiceId
$mVoiceId_CRISTIANO :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_CRISTIANO = VoiceId' "CRISTIANO"

pattern VoiceId_DORA :: VoiceId
pattern $bVoiceId_DORA :: VoiceId
$mVoiceId_DORA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_DORA = VoiceId' "DORA"

pattern VoiceId_EMMA :: VoiceId
pattern $bVoiceId_EMMA :: VoiceId
$mVoiceId_EMMA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_EMMA = VoiceId' "EMMA"

pattern VoiceId_ENRIQUE :: VoiceId
pattern $bVoiceId_ENRIQUE :: VoiceId
$mVoiceId_ENRIQUE :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_ENRIQUE = VoiceId' "ENRIQUE"

pattern VoiceId_EWA :: VoiceId
pattern $bVoiceId_EWA :: VoiceId
$mVoiceId_EWA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_EWA = VoiceId' "EWA"

pattern VoiceId_FILIZ :: VoiceId
pattern $bVoiceId_FILIZ :: VoiceId
$mVoiceId_FILIZ :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_FILIZ = VoiceId' "FILIZ"

pattern VoiceId_GERAINT :: VoiceId
pattern $bVoiceId_GERAINT :: VoiceId
$mVoiceId_GERAINT :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_GERAINT = VoiceId' "GERAINT"

pattern VoiceId_GIORGIO :: VoiceId
pattern $bVoiceId_GIORGIO :: VoiceId
$mVoiceId_GIORGIO :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_GIORGIO = VoiceId' "GIORGIO"

pattern VoiceId_GWYNETH :: VoiceId
pattern $bVoiceId_GWYNETH :: VoiceId
$mVoiceId_GWYNETH :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_GWYNETH = VoiceId' "GWYNETH"

pattern VoiceId_HANS :: VoiceId
pattern $bVoiceId_HANS :: VoiceId
$mVoiceId_HANS :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_HANS = VoiceId' "HANS"

pattern VoiceId_INES :: VoiceId
pattern $bVoiceId_INES :: VoiceId
$mVoiceId_INES :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_INES = VoiceId' "INES"

pattern VoiceId_IVY :: VoiceId
pattern $bVoiceId_IVY :: VoiceId
$mVoiceId_IVY :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_IVY = VoiceId' "IVY"

pattern VoiceId_JACEK :: VoiceId
pattern $bVoiceId_JACEK :: VoiceId
$mVoiceId_JACEK :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_JACEK = VoiceId' "JACEK"

pattern VoiceId_JAN :: VoiceId
pattern $bVoiceId_JAN :: VoiceId
$mVoiceId_JAN :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_JAN = VoiceId' "JAN"

pattern VoiceId_JOANNA :: VoiceId
pattern $bVoiceId_JOANNA :: VoiceId
$mVoiceId_JOANNA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_JOANNA = VoiceId' "JOANNA"

pattern VoiceId_JOEY :: VoiceId
pattern $bVoiceId_JOEY :: VoiceId
$mVoiceId_JOEY :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_JOEY = VoiceId' "JOEY"

pattern VoiceId_JUSTIN :: VoiceId
pattern $bVoiceId_JUSTIN :: VoiceId
$mVoiceId_JUSTIN :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_JUSTIN = VoiceId' "JUSTIN"

pattern VoiceId_KARL :: VoiceId
pattern $bVoiceId_KARL :: VoiceId
$mVoiceId_KARL :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_KARL = VoiceId' "KARL"

pattern VoiceId_KENDRA :: VoiceId
pattern $bVoiceId_KENDRA :: VoiceId
$mVoiceId_KENDRA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_KENDRA = VoiceId' "KENDRA"

pattern VoiceId_KIMBERLY :: VoiceId
pattern $bVoiceId_KIMBERLY :: VoiceId
$mVoiceId_KIMBERLY :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_KIMBERLY = VoiceId' "KIMBERLY"

pattern VoiceId_LEA :: VoiceId
pattern $bVoiceId_LEA :: VoiceId
$mVoiceId_LEA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_LEA = VoiceId' "LEA"

pattern VoiceId_LIV :: VoiceId
pattern $bVoiceId_LIV :: VoiceId
$mVoiceId_LIV :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_LIV = VoiceId' "LIV"

pattern VoiceId_LOTTE :: VoiceId
pattern $bVoiceId_LOTTE :: VoiceId
$mVoiceId_LOTTE :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_LOTTE = VoiceId' "LOTTE"

pattern VoiceId_LUCIA :: VoiceId
pattern $bVoiceId_LUCIA :: VoiceId
$mVoiceId_LUCIA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_LUCIA = VoiceId' "LUCIA"

pattern VoiceId_LUPE :: VoiceId
pattern $bVoiceId_LUPE :: VoiceId
$mVoiceId_LUPE :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_LUPE = VoiceId' "LUPE"

pattern VoiceId_MADS :: VoiceId
pattern $bVoiceId_MADS :: VoiceId
$mVoiceId_MADS :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MADS = VoiceId' "MADS"

pattern VoiceId_MAJA :: VoiceId
pattern $bVoiceId_MAJA :: VoiceId
$mVoiceId_MAJA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MAJA = VoiceId' "MAJA"

pattern VoiceId_MARLENE :: VoiceId
pattern $bVoiceId_MARLENE :: VoiceId
$mVoiceId_MARLENE :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MARLENE = VoiceId' "MARLENE"

pattern VoiceId_MATHIEU :: VoiceId
pattern $bVoiceId_MATHIEU :: VoiceId
$mVoiceId_MATHIEU :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MATHIEU = VoiceId' "MATHIEU"

pattern VoiceId_MATTHEW :: VoiceId
pattern $bVoiceId_MATTHEW :: VoiceId
$mVoiceId_MATTHEW :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MATTHEW = VoiceId' "MATTHEW"

pattern VoiceId_MAXIM :: VoiceId
pattern $bVoiceId_MAXIM :: VoiceId
$mVoiceId_MAXIM :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MAXIM = VoiceId' "MAXIM"

pattern VoiceId_MIA :: VoiceId
pattern $bVoiceId_MIA :: VoiceId
$mVoiceId_MIA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MIA = VoiceId' "MIA"

pattern VoiceId_MIGUEL :: VoiceId
pattern $bVoiceId_MIGUEL :: VoiceId
$mVoiceId_MIGUEL :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MIGUEL = VoiceId' "MIGUEL"

pattern VoiceId_MIZUKI :: VoiceId
pattern $bVoiceId_MIZUKI :: VoiceId
$mVoiceId_MIZUKI :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_MIZUKI = VoiceId' "MIZUKI"

pattern VoiceId_NAJA :: VoiceId
pattern $bVoiceId_NAJA :: VoiceId
$mVoiceId_NAJA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_NAJA = VoiceId' "NAJA"

pattern VoiceId_NICOLE :: VoiceId
pattern $bVoiceId_NICOLE :: VoiceId
$mVoiceId_NICOLE :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_NICOLE = VoiceId' "NICOLE"

pattern VoiceId_PENELOPE :: VoiceId
pattern $bVoiceId_PENELOPE :: VoiceId
$mVoiceId_PENELOPE :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_PENELOPE = VoiceId' "PENELOPE"

pattern VoiceId_RAVEENA :: VoiceId
pattern $bVoiceId_RAVEENA :: VoiceId
$mVoiceId_RAVEENA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_RAVEENA = VoiceId' "RAVEENA"

pattern VoiceId_RICARDO :: VoiceId
pattern $bVoiceId_RICARDO :: VoiceId
$mVoiceId_RICARDO :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_RICARDO = VoiceId' "RICARDO"

pattern VoiceId_RUBEN :: VoiceId
pattern $bVoiceId_RUBEN :: VoiceId
$mVoiceId_RUBEN :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_RUBEN = VoiceId' "RUBEN"

pattern VoiceId_RUSSELL :: VoiceId
pattern $bVoiceId_RUSSELL :: VoiceId
$mVoiceId_RUSSELL :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_RUSSELL = VoiceId' "RUSSELL"

pattern VoiceId_SALLI :: VoiceId
pattern $bVoiceId_SALLI :: VoiceId
$mVoiceId_SALLI :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_SALLI = VoiceId' "SALLI"

pattern VoiceId_SEOYEON :: VoiceId
pattern $bVoiceId_SEOYEON :: VoiceId
$mVoiceId_SEOYEON :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_SEOYEON = VoiceId' "SEOYEON"

pattern VoiceId_TAKUMI :: VoiceId
pattern $bVoiceId_TAKUMI :: VoiceId
$mVoiceId_TAKUMI :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_TAKUMI = VoiceId' "TAKUMI"

pattern VoiceId_TATYANA :: VoiceId
pattern $bVoiceId_TATYANA :: VoiceId
$mVoiceId_TATYANA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_TATYANA = VoiceId' "TATYANA"

pattern VoiceId_VICKI :: VoiceId
pattern $bVoiceId_VICKI :: VoiceId
$mVoiceId_VICKI :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_VICKI = VoiceId' "VICKI"

pattern VoiceId_VITORIA :: VoiceId
pattern $bVoiceId_VITORIA :: VoiceId
$mVoiceId_VITORIA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_VITORIA = VoiceId' "VITORIA"

pattern VoiceId_ZEINA :: VoiceId
pattern $bVoiceId_ZEINA :: VoiceId
$mVoiceId_ZEINA :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_ZEINA = VoiceId' "ZEINA"

pattern VoiceId_ZHIYU :: VoiceId
pattern $bVoiceId_ZHIYU :: VoiceId
$mVoiceId_ZHIYU :: forall {r}. VoiceId -> ((# #) -> r) -> ((# #) -> r) -> r
VoiceId_ZHIYU = VoiceId' "ZHIYU"

{-# COMPLETE
  VoiceId_AMY,
  VoiceId_ASTRID,
  VoiceId_BIANCA,
  VoiceId_BRIAN,
  VoiceId_CAMILA,
  VoiceId_CARLA,
  VoiceId_CARMEN,
  VoiceId_CELINE,
  VoiceId_CHANTAL,
  VoiceId_CONCHITA,
  VoiceId_CRISTIANO,
  VoiceId_DORA,
  VoiceId_EMMA,
  VoiceId_ENRIQUE,
  VoiceId_EWA,
  VoiceId_FILIZ,
  VoiceId_GERAINT,
  VoiceId_GIORGIO,
  VoiceId_GWYNETH,
  VoiceId_HANS,
  VoiceId_INES,
  VoiceId_IVY,
  VoiceId_JACEK,
  VoiceId_JAN,
  VoiceId_JOANNA,
  VoiceId_JOEY,
  VoiceId_JUSTIN,
  VoiceId_KARL,
  VoiceId_KENDRA,
  VoiceId_KIMBERLY,
  VoiceId_LEA,
  VoiceId_LIV,
  VoiceId_LOTTE,
  VoiceId_LUCIA,
  VoiceId_LUPE,
  VoiceId_MADS,
  VoiceId_MAJA,
  VoiceId_MARLENE,
  VoiceId_MATHIEU,
  VoiceId_MATTHEW,
  VoiceId_MAXIM,
  VoiceId_MIA,
  VoiceId_MIGUEL,
  VoiceId_MIZUKI,
  VoiceId_NAJA,
  VoiceId_NICOLE,
  VoiceId_PENELOPE,
  VoiceId_RAVEENA,
  VoiceId_RICARDO,
  VoiceId_RUBEN,
  VoiceId_RUSSELL,
  VoiceId_SALLI,
  VoiceId_SEOYEON,
  VoiceId_TAKUMI,
  VoiceId_TATYANA,
  VoiceId_VICKI,
  VoiceId_VITORIA,
  VoiceId_ZEINA,
  VoiceId_ZHIYU,
  VoiceId'
  #-}