------------------------------------------------------------------------------
-- |
-- Module      : Data.TTC
-- Description : textual type classes
-- Copyright   : Copyright (c) 2019-2023 Travis Cardwell
-- License     : MIT
--
-- TTC, an initialism of /Textual Type Classes/, is a library that provides
-- type classes for conversion between data types and textual data types
-- (strings).
--
-- This library is meant to be imported qualified, as follows:
--
-- @
-- import qualified Data.TTC as TTC
-- @
------------------------------------------------------------------------------

{-# LANGUAGE CPP #-}
{-# LANGUAGE DefaultSignatures #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}

#if __GLASGOW_HASKELL__ >= 900
{-# LANGUAGE ExplicitForAll #-}
#endif

module Data.TTC
  ( -- * Textual
    Textual
  , convert
    -- ** \"To\" Conversions
    -- $TextualTo
  , toS
  , toT
  , toTL
  , toTLB
  , toST
  , toBS
  , toBSL
  , toBSB
  , toSBS
    -- ** \"From\" Conversions
    -- $TextualFrom
  , fromS
  , fromT
  , fromTL
  , fromTLB
  , fromST
  , fromBS
  , fromBSL
  , fromBSB
  , fromSBS
    -- ** \"As\" Conversions
    -- $TextualAs
  , asS
  , asT
  , asTL
  , asTLB
  , asST
  , asBS
  , asBSL
  , asBSB
  , asSBS
    -- * Render
  , Render(..)
  , RenderDefault(..)
    -- ** Rendering Specific Types
    -- $RenderSpecific
  , renderS
  , renderT
  , renderTL
  , renderTLB
  , renderST
  , renderBS
  , renderBSL
  , renderBSB
  , renderSBS
    -- ** Render Utilities
  , renderWithShow
    -- * Parse
  , Parse(..)
  , ParseDefault(..)
    -- ** Parsing From Specific Types
    -- $ParseSpecific
  , parseS
  , parseT
  , parseTL
  , parseTLB
  , parseST
  , parseBS
  , parseBSL
  , parseBSB
  , parseSBS
    -- ** 'Maybe' Parsing
    -- $ParseMaybe
  , parseMaybe
  , parseMaybeS
  , parseMaybeT
  , parseMaybeTL
  , parseMaybeTLB
  , parseMaybeST
  , parseMaybeBS
  , parseMaybeBSL
  , parseMaybeBSB
  , parseMaybeSBS
    -- ** 'MonadFail' Parsing
    -- $ParseOrFail
  , parseOrFail
  , parseOrFailS
  , parseOrFailT
  , parseOrFailTL
  , parseOrFailTLB
  , parseOrFailST
  , parseOrFailBS
  , parseOrFailBSL
  , parseOrFailBSB
  , parseOrFailSBS
    -- ** Unsafe Parsing
    -- $ParseUnsafe
  , parseUnsafe
  , parseUnsafeS
  , parseUnsafeT
  , parseUnsafeTL
  , parseUnsafeTLB
  , parseUnsafeST
  , parseUnsafeBS
  , parseUnsafeBSL
  , parseUnsafeBSB
  , parseUnsafeSBS
    -- ** Parse With A Single Error Message
    -- $ParseWithASingleErrorMessage
  , withError
  , withErrorS
  , withErrorT
  , withErrorTL
  , withErrorTLB
  , withErrorST
  , withErrorBS
  , withErrorBSL
  , withErrorBSB
  , withErrorSBS
    -- ** Parse With An Error Prefix
    -- $ParseWithAnErrorPrefix
  , prefixError
  , prefixErrorS
  , prefixErrorT
  , prefixErrorTL
  , prefixErrorTLB
  , prefixErrorST
  , prefixErrorBS
  , prefixErrorBSL
  , prefixErrorBSB
  , prefixErrorSBS
    -- ** Parse Enums
  , parseEnum
  , parseEnum'
    -- ** Read Instances
  , parseWithRead
  , parseWithRead'
  , maybeParseWithRead
  , readsEnum
  , readsWithParse
    -- ** Constant Validation
    -- $ParseValid
  , valid
  , validOf
  , mkValid
  , untypedValidOf
  , mkUntypedValid
  , mkUntypedValidQQ
  ) where

-- https://hackage.haskell.org/package/base
#if __GLASGOW_HASKELL__ <= 806
import Control.Monad.Fail (MonadFail)
#endif
import Data.Int (Int16, Int32, Int64, Int8)
import Data.Proxy (Proxy(Proxy), asProxyTypeOf)
import Data.String (IsString(fromString))
import Data.Word (Word16, Word32, Word64, Word8)
import GHC.Stack (HasCallStack)
import Text.Read (readMaybe)

-- https://hackage.haskell.org/package/bytestring
import qualified Data.ByteString as BS
import qualified Data.ByteString.Builder as BSB
import qualified Data.ByteString.Lazy as BSL
import qualified Data.ByteString.Short as SBS

-- https://hackage.haskell.org/package/template-haskell
import qualified Language.Haskell.TH as TH
import qualified Language.Haskell.TH.Quote as Q
import qualified Language.Haskell.TH.Syntax as THS

-- https://hackage.haskell.org/package/text
import qualified Data.Text as T
import qualified Data.Text.Encoding as TE
import qualified Data.Text.Encoding.Error as TEE
import qualified Data.Text.Lazy as TL
import qualified Data.Text.Lazy.Builder as TLB
import qualified Data.Text.Lazy.Encoding as TLE

-- https://hackage.haskell.org/package/text-short
import qualified Data.Text.Short as ST

------------------------------------------------------------------------------
-- $Textual

-- | The 'Textual' type class is used to convert between the following textual
-- data types:
--
-- * 'String' (@S@)
-- * Strict 'T.Text' (@T@)
-- * Lazy 'TL.Text' (@TL@)
-- * @Text@ 'TLB.Builder' (@TLB@)
-- * 'ST.ShortText' (@ST@)
-- * Strict 'BS.ByteString' (@BS@)
-- * Lazy 'BSL.ByteString' (@BSL@)
-- * @ByteString@ 'BSB.Builder' (@BSB@) (Note: @Data.Binary.Builder@
--   re-exports this type, so TTC can be used with @binary@ as well.)
-- * 'SBS.ShortByteString' (@SBS@)
--
-- @ByteString@ values are assumed to be UTF-8 encoded text.  Invalid bytes
-- are replaced with the Unicode replacement character @U+FFFD@.  In cases
-- where different behavior is required, process @ByteString@ values /before/
-- using this class.
--
-- This type class has two key features:
--
-- * Type conversion is /not/ done through a fixed type (such as 'String' or
--   'T.Text').
-- * It has a single type variable, making it easy to write functions that
--   accept arguments and/or return values that may be any of the supported
--   textual data types.
--
-- Note that support for additional data types cannot be implemented by
-- writing instances.  Adding support for additional data types would require
-- changing the class definition itself.
--
-- For more details, see the following article:
-- <https://www.extrema.is/articles/ttc-textual-type-classes/textual-type-class>
--
-- @since 0.1.0.0
class Textual t where
  -- | Convert to a 'String'
  --
  -- @since 0.1.0.0
  toS :: t -> String

  -- | Convert to strict 'T.Text'
  --
  -- @since 0.1.0.0
  toT :: t -> T.Text

  -- | Convert to lazy 'TL.Text'
  --
  -- @since 0.1.0.0
  toTL :: t -> TL.Text

  -- | Convert to a @Text@ 'TLB.Builder'
  --
  -- @since 1.1.0.0
  toTLB :: t -> TLB.Builder

  -- | Convert to 'ST.ShortText'
  --
  -- @since 1.4.0.0
  toST :: t -> ST.ShortText

  -- | Convert to a strict 'BS.ByteString'
  --
  -- @since 0.1.0.0
  toBS :: t -> BS.ByteString

  -- | Convert to a lazy 'BS.ByteString'
  --
  -- @since 0.1.0.0
  toBSL :: t -> BSL.ByteString

  -- | Convert to a @ByteString@ 'BSB.Builder'
  --
  -- @since 1.1.0.0
  toBSB :: t -> BSB.Builder

  -- | Convert to a 'SBS.ShortByteString'
  --
  -- @since 1.1.0.0
  toSBS :: t -> SBS.ShortByteString

  -- | Convert between any supported textual data types
  --
  -- @since 0.1.0.0
  convert :: Textual t' => t' -> t

instance Textual String where
  toS :: String -> String
toS = forall a. a -> a
id
  toT :: String -> Text
toT = String -> Text
T.pack
  toTL :: String -> Text
toTL = String -> Text
TL.pack
  toTLB :: String -> Builder
toTLB = String -> Builder
TLB.fromString
  toST :: String -> ShortText
toST = String -> ShortText
ST.fromString
  toBS :: String -> ByteString
toBS = Text -> ByteString
TE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Text
T.pack
  toBSL :: String -> ByteString
toBSL = Text -> ByteString
TLE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Text
TL.pack
  toBSB :: String -> Builder
toBSB = ByteString -> Builder
BSB.byteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Text
T.pack
  toSBS :: String -> ShortByteString
toSBS = ByteString -> ShortByteString
SBS.toShort forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Text
T.pack
  convert :: forall t'. Textual t' => t' -> String
convert = forall t'. Textual t' => t' -> String
toS
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual T.Text where
  toS :: Text -> String
toS = Text -> String
T.unpack
  toT :: Text -> Text
toT = forall a. a -> a
id
  toTL :: Text -> Text
toTL = Text -> Text
TL.fromStrict
  toTLB :: Text -> Builder
toTLB = Text -> Builder
TLB.fromText
  toST :: Text -> ShortText
toST = Text -> ShortText
ST.fromText
  toBS :: Text -> ByteString
toBS = Text -> ByteString
TE.encodeUtf8
  toBSL :: Text -> ByteString
toBSL = Text -> ByteString
TLE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Text
TL.fromStrict
  toBSB :: Text -> Builder
toBSB = ByteString -> Builder
BSB.byteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TE.encodeUtf8
  toSBS :: Text -> ShortByteString
toSBS = ByteString -> ShortByteString
SBS.toShort forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TE.encodeUtf8
  convert :: forall t'. Textual t' => t' -> Text
convert = forall t'. Textual t' => t' -> Text
toT
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual TL.Text where
  toS :: Text -> String
toS = Text -> String
TL.unpack
  toT :: Text -> Text
toT = Text -> Text
TL.toStrict
  toTL :: Text -> Text
toTL = forall a. a -> a
id
  toTLB :: Text -> Builder
toTLB = Text -> Builder
TLB.fromLazyText
  toST :: Text -> ShortText
toST = Text -> ShortText
ST.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Text
TL.toStrict
  toBS :: Text -> ByteString
toBS = ByteString -> ByteString
BSL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TLE.encodeUtf8
  toBSL :: Text -> ByteString
toBSL = Text -> ByteString
TLE.encodeUtf8
  toBSB :: Text -> Builder
toBSB = ByteString -> Builder
BSB.lazyByteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TLE.encodeUtf8
  toSBS :: Text -> ShortByteString
toSBS = ByteString -> ShortByteString
SBS.toShort forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
BSL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TLE.encodeUtf8
  convert :: forall t'. Textual t' => t' -> Text
convert = forall t'. Textual t' => t' -> Text
toTL
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual TLB.Builder where
  toS :: Builder -> String
toS = Text -> String
TL.unpack forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
TLB.toLazyText
  toT :: Builder -> Text
toT = Text -> Text
TL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
TLB.toLazyText
  toTL :: Builder -> Text
toTL = Builder -> Text
TLB.toLazyText
  toTLB :: Builder -> Builder
toTLB = forall a. a -> a
id
  toST :: Builder -> ShortText
toST = Text -> ShortText
ST.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Text
TL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
TLB.toLazyText
  toBS :: Builder -> ByteString
toBS = ByteString -> ByteString
BSL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TLE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
TLB.toLazyText
  toBSL :: Builder -> ByteString
toBSL = Text -> ByteString
TLE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
TLB.toLazyText
  toBSB :: Builder -> Builder
toBSB = ByteString -> Builder
BSB.lazyByteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TLE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
TLB.toLazyText
  toSBS :: Builder -> ShortByteString
toSBS = ByteString -> ShortByteString
SBS.toShort forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
BSL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TLE.encodeUtf8 forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
TLB.toLazyText
  convert :: forall t'. Textual t' => t' -> Builder
convert = forall t'. Textual t' => t' -> Builder
toTLB
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual ST.ShortText where
  toS :: ShortText -> String
toS = ShortText -> String
ST.toString
  toT :: ShortText -> Text
toT = ShortText -> Text
ST.toText
  toTL :: ShortText -> Text
toTL = Text -> Text
TL.fromStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortText -> Text
ST.toText
  toTLB :: ShortText -> Builder
toTLB = Text -> Builder
TLB.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortText -> Text
ST.toText
  toST :: ShortText -> ShortText
toST = forall a. a -> a
id
  toBS :: ShortText -> ByteString
toBS = ShortText -> ByteString
ST.toByteString
  toBSL :: ShortText -> ByteString
toBSL = ByteString -> ByteString
BSL.fromStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortText -> ByteString
ST.toByteString
  toBSB :: ShortText -> Builder
toBSB = ByteString -> Builder
BSB.byteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortText -> ByteString
ST.toByteString
  toSBS :: ShortText -> ShortByteString
toSBS = ShortText -> ShortByteString
ST.toShortByteString
  convert :: forall t'. Textual t' => t' -> ShortText
convert = forall t'. Textual t' => t' -> ShortText
toST
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual BS.ByteString where
  toS :: ByteString -> String
toS = Text -> String
T.unpack forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toT :: ByteString -> Text
toT = OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toTL :: ByteString -> Text
toTL = OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
BSL.fromStrict
  toTLB :: ByteString -> Builder
toTLB = Text -> Builder
TLB.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toST :: ByteString -> ShortText
toST = Text -> ShortText
ST.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toBS :: ByteString -> ByteString
toBS = forall a. a -> a
id
  toBSL :: ByteString -> ByteString
toBSL = ByteString -> ByteString
BSL.fromStrict
  toBSB :: ByteString -> Builder
toBSB = ByteString -> Builder
BSB.byteString
  toSBS :: ByteString -> ShortByteString
toSBS = ByteString -> ShortByteString
SBS.toShort
  convert :: forall t'. Textual t' => t' -> ByteString
convert = forall t'. Textual t' => t' -> ByteString
toBS
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual BSL.ByteString where
  toS :: ByteString -> String
toS = Text -> String
TL.unpack forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toT :: ByteString -> Text
toT = Text -> Text
TL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toTL :: ByteString -> Text
toTL = OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toTLB :: ByteString -> Builder
toTLB = Text -> Builder
TLB.fromLazyText forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toST :: ByteString -> ShortText
toST = Text -> ShortText
ST.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Text
TL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode
  toBS :: ByteString -> ByteString
toBS = ByteString -> ByteString
BSL.toStrict
  toBSL :: ByteString -> ByteString
toBSL = forall a. a -> a
id
  toBSB :: ByteString -> Builder
toBSB = ByteString -> Builder
BSB.lazyByteString
  toSBS :: ByteString -> ShortByteString
toSBS = ByteString -> ShortByteString
SBS.toShort forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
BSL.toStrict
  convert :: forall t'. Textual t' => t' -> ByteString
convert = forall t'. Textual t' => t' -> ByteString
toBSL
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual BSB.Builder where
  toS :: Builder -> String
toS =
    Text -> String
TL.unpack forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BSB.toLazyByteString
  toT :: Builder -> Text
toT =
    Text -> Text
TL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BSB.toLazyByteString
  toTL :: Builder -> Text
toTL = OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BSB.toLazyByteString
  toTLB :: Builder -> Builder
toTLB
    = Text -> Builder
TLB.fromLazyText
    forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode
    forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BSB.toLazyByteString
  toST :: Builder -> ShortText
toST
    = Text -> ShortText
ST.fromText
    forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Text
TL.toStrict
    forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode
    forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BSB.toLazyByteString
  toBS :: Builder -> ByteString
toBS = ByteString -> ByteString
BSL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BSB.toLazyByteString
  toBSL :: Builder -> ByteString
toBSL = Builder -> ByteString
BSB.toLazyByteString
  toBSB :: Builder -> Builder
toBSB = forall a. a -> a
id
  toSBS :: Builder -> ShortByteString
toSBS = ByteString -> ShortByteString
SBS.toShort forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
BSL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BSB.toLazyByteString
  convert :: forall t'. Textual t' => t' -> Builder
convert = forall t'. Textual t' => t' -> Builder
toBSB
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

instance Textual SBS.ShortByteString where
  toS :: ShortByteString -> String
toS = Text -> String
T.unpack forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortByteString -> ByteString
SBS.fromShort
  toT :: ShortByteString -> Text
toT = OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortByteString -> ByteString
SBS.fromShort
  toTL :: ShortByteString -> Text
toTL = OnDecodeError -> ByteString -> Text
TLE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
BSL.fromStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortByteString -> ByteString
SBS.fromShort
  toTLB :: ShortByteString -> Builder
toTLB = Text -> Builder
TLB.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortByteString -> ByteString
SBS.fromShort
  toST :: ShortByteString -> ShortText
toST = Text -> ShortText
ST.fromText forall b c a. (b -> c) -> (a -> b) -> a -> c
. OnDecodeError -> ByteString -> Text
TE.decodeUtf8With OnDecodeError
TEE.lenientDecode forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortByteString -> ByteString
SBS.fromShort
  toBS :: ShortByteString -> ByteString
toBS = ShortByteString -> ByteString
SBS.fromShort
  toBSL :: ShortByteString -> ByteString
toBSL = ByteString -> ByteString
BSL.fromStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortByteString -> ByteString
SBS.fromShort
  toBSB :: ShortByteString -> Builder
toBSB = ByteString -> Builder
BSB.byteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShortByteString -> ByteString
SBS.fromShort
  toSBS :: ShortByteString -> ShortByteString
toSBS = forall a. a -> a
id
  convert :: forall t'. Textual t' => t' -> ShortByteString
convert = forall t'. Textual t' => t' -> ShortByteString
toSBS
  {-# INLINE toS #-}
  {-# INLINE toT #-}
  {-# INLINE toTL #-}
  {-# INLINE toTLB #-}
  {-# INLINE toST #-}
  {-# INLINE toBS #-}
  {-# INLINE toBSL #-}
  {-# INLINE toBSB #-}
  {-# INLINE toSBS #-}
  {-# INLINE convert #-}

------------------------------------------------------------------------------
-- $TextualTo
--
-- These functions are equivalent to 'convert', but they specify the type
-- being converted to.  Use them to avoid having to write type annotations in
-- cases where the type is ambiguous.

-- $TextualFrom
--
-- These functions are equivalent to 'convert', but they specify the type
-- being converted from.  Use them to avoid having to write type annotations
-- in cases where the type is ambiguous.

-- | Convert from a 'String'
--
-- @since 0.1.0.0
fromS :: Textual t => String -> t
fromS :: forall t. Textual t => String -> t
fromS = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromS #-}

-- | Convert from strict 'T.Text'
--
-- @since 0.1.0.0
fromT :: Textual t => T.Text -> t
fromT :: forall t. Textual t => Text -> t
fromT = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromT #-}

-- | Convert from lazy 'TL.Text'
--
-- @since 0.1.0.0
fromTL :: Textual t => TL.Text -> t
fromTL :: forall t. Textual t => Text -> t
fromTL = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromTL #-}

-- | Convert from a @Text@ 'TLB.Builder'
--
-- @since 1.1.0.0
fromTLB :: Textual t => TLB.Builder -> t
fromTLB :: forall t. Textual t => Builder -> t
fromTLB = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromTLB #-}

-- | Convert from a 'ST.ShortText'
--
-- @since 1.4.0.0
fromST :: Textual t => ST.ShortText -> t
fromST :: forall t. Textual t => ShortText -> t
fromST = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromST #-}

-- | Convert from a strict 'BS.ByteString'
--
-- @since 0.1.0.0
fromBS :: Textual t => BS.ByteString -> t
fromBS :: forall t. Textual t => ByteString -> t
fromBS = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromBS #-}

-- | Convert from a lazy 'BSL.ByteString'
--
-- @since 0.1.0.0
fromBSL :: Textual t => BSL.ByteString -> t
fromBSL :: forall t. Textual t => ByteString -> t
fromBSL = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromBSL #-}

-- | Convert from a @ByteString@ 'TLB.Builder'
--
-- @since 1.1.0.0
fromBSB :: Textual t => BSB.Builder -> t
fromBSB :: forall t. Textual t => Builder -> t
fromBSB = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromBSB #-}

-- | Convert from a 'SBS.ShortByteString'
--
-- @since 1.1.0.0
fromSBS :: Textual t => SBS.ShortByteString -> t
fromSBS :: forall t. Textual t => ShortByteString -> t
fromSBS = forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE fromSBS #-}

------------------------------------------------------------------------------
-- $TextualAs
--
-- These functions are used to convert a 'Textual' argument of a function to a
-- specific type.  Use them to reduce boilerplate in small function
-- definitions.

-- | Convert an argument to a 'String'
--
-- @since 0.1.0.0
asS :: Textual t => (String -> a) -> t -> a
asS :: forall t a. Textual t => (String -> a) -> t -> a
asS String -> a
f = String -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asS #-}

-- | Convert an argument to strict 'T.Text'
--
-- @since 0.1.0.0
asT :: Textual t => (T.Text -> a) -> t -> a
asT :: forall t a. Textual t => (Text -> a) -> t -> a
asT Text -> a
f = Text -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asT #-}

-- | Convert an argument to lazy 'TL.Text'
--
-- @since 0.1.0.0
asTL :: Textual t => (TL.Text -> a) -> t -> a
asTL :: forall t a. Textual t => (Text -> a) -> t -> a
asTL Text -> a
f = Text -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asTL #-}

-- | Convert an argument to a @Text@ 'TLB.Builder'
--
-- @since 1.1.0.0
asTLB :: Textual t => (TLB.Builder -> a) -> t -> a
asTLB :: forall t a. Textual t => (Builder -> a) -> t -> a
asTLB Builder -> a
f = Builder -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asTLB #-}

-- | Convert an argument to a 'ST.ShortText'
--
-- @since 1.4.0.0
asST :: Textual t => (ST.ShortText -> a) -> t -> a
asST :: forall t a. Textual t => (ShortText -> a) -> t -> a
asST ShortText -> a
f = ShortText -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asST #-}

-- | Convert an argument to a strict 'BS.ByteString'
--
-- @since 0.1.0.0
asBS :: Textual t => (BS.ByteString -> a) -> t -> a
asBS :: forall t a. Textual t => (ByteString -> a) -> t -> a
asBS ByteString -> a
f = ByteString -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asBS #-}

-- | Convert an argument to a lazy 'BSL.ByteString'
--
-- @since 0.1.0.0
asBSL :: Textual t => (BSL.ByteString -> a) -> t -> a
asBSL :: forall t a. Textual t => (ByteString -> a) -> t -> a
asBSL ByteString -> a
f = ByteString -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asBSL #-}

-- | Convert an argument to a @ByteString@ 'TLB.Builder'
--
-- @since 1.1.0.0
asBSB :: Textual t => (BSB.Builder -> a ) -> t -> a
asBSB :: forall t a. Textual t => (Builder -> a) -> t -> a
asBSB Builder -> a
f = Builder -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asBSB #-}

-- | Convert an argument to a 'SBS.ShortByteString'
--
-- @since 1.1.0.0
asSBS :: Textual t => (SBS.ShortByteString -> a) -> t -> a
asSBS :: forall t a. Textual t => (ShortByteString -> a) -> t -> a
asSBS ShortByteString -> a
f = ShortByteString -> a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert
{-# INLINE asSBS #-}

------------------------------------------------------------------------------
-- $Render

-- | The 'Render' type class renders a data type as a textual data type.
--
-- There are no default instances for the 'Render' type class, so that all
-- instances can be customized per project when desired.  Instances for some
-- basic data types are defined for the 'RenderDefault' type class, however,
-- and you can load the 'Render' instance as follows:
--
-- @
-- instance TTC.Render Int
-- @
--
-- Since a type may have at most one instance of a given type class, special
-- care must be taken when defining type class instances in a shared library.
-- In particular, orphan instances should generally not be used in shared
-- libraries since they prevent users of the libraries from writing their own
-- instances.
--
-- See the @uname@ and @prompt@ example programs in the @examples@ directory.
--
-- For more details, see the following article:
-- <https://www.extrema.is/articles/ttc-textual-type-classes/render-and-parse>
--
-- @since 0.1.0.0
class Render a where
  render :: Textual t => a -> t

  default render :: (RenderDefault a, Textual t) => a -> t
  render = forall a t. (RenderDefault a, Textual t) => a -> t
renderDefault

------------------------------------------------------------------------------

-- | The 'RenderDefault' type class provides some default 'Render' instances.
--
-- * The 'Char' instance renders a single-character string.
-- * Numeric type instances all render using the 'Show' instance.
-- * Textual type instances all convert to the target 'Textual' data type.
--
-- @since 1.1.0.0
class RenderDefault a where
  renderDefault :: Textual t => a -> t

instance RenderDefault Char where
  renderDefault :: forall t. Textual t => Char -> t
renderDefault Char
c = forall t. Textual t => String -> t
fromS [Char
c]

instance RenderDefault Double where
  renderDefault :: forall t. Textual t => Double -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Float where
  renderDefault :: forall t. Textual t => Float -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Int where
  renderDefault :: forall t. Textual t => Int -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Int8 where
  renderDefault :: forall t. Textual t => Int8 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Int16 where
  renderDefault :: forall t. Textual t => Int16 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Int32 where
  renderDefault :: forall t. Textual t => Int32 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Int64 where
  renderDefault :: forall t. Textual t => Int64 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Integer where
  renderDefault :: forall t. Textual t => Integer -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Word where
  renderDefault :: forall t. Textual t => Word -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Word8 where
  renderDefault :: forall t. Textual t => Word8 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Word16 where
  renderDefault :: forall t. Textual t => Word16 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Word32 where
  renderDefault :: forall t. Textual t => Word32 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault Word64 where
  renderDefault :: forall t. Textual t => Word64 -> t
renderDefault = forall a t. (Show a, Textual t) => a -> t
renderWithShow

instance RenderDefault String where
  renderDefault :: forall t. Textual t => String -> t
renderDefault = forall t. Textual t => String -> t
fromS

instance RenderDefault BSL.ByteString where
  renderDefault :: forall t. Textual t => ByteString -> t
renderDefault = forall t. Textual t => ByteString -> t
fromBSL

instance RenderDefault BS.ByteString where
  renderDefault :: forall t. Textual t => ByteString -> t
renderDefault = forall t. Textual t => ByteString -> t
fromBS

instance RenderDefault TL.Text where
  renderDefault :: forall t. Textual t => Text -> t
renderDefault = forall t. Textual t => Text -> t
fromTL

instance RenderDefault T.Text where
  renderDefault :: forall t. Textual t => Text -> t
renderDefault = forall t. Textual t => Text -> t
fromT

------------------------------------------------------------------------------
-- $RenderSpecific
--
-- These functions are equivalent to 'render', but they specify the type being
-- rendered to.  Use them to avoid having to write type annotations in cases
-- where the type is ambiguous.

-- | Render to a 'String'
--
-- @since 0.1.0.0
renderS :: Render a => a -> String
renderS :: forall a. Render a => a -> String
renderS = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderS #-}

-- | Render to strict 'T.Text'
--
-- @since 0.1.0.0
renderT :: Render a => a -> T.Text
renderT :: forall a. Render a => a -> Text
renderT = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderT #-}

-- | Render to lazy 'TL.Text'
--
-- @since 0.1.0.0
renderTL :: Render a => a -> TL.Text
renderTL :: forall a. Render a => a -> Text
renderTL = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderTL #-}

-- | Render to a @Text@ 'TLB.Builder'
--
-- @since 0.4.0.0
renderTLB :: Render a => a -> TLB.Builder
renderTLB :: forall a. Render a => a -> Builder
renderTLB = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderTLB #-}

-- | Render to a 'ST.ShortText'
--
-- @since 1.4.0.0
renderST :: Render a => a -> ST.ShortText
renderST :: forall a. Render a => a -> ShortText
renderST = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderST #-}

-- | Render to a strict 'BS.ByteString'
--
-- @since 0.1.0.0
renderBS :: Render a => a -> BS.ByteString
renderBS :: forall a. Render a => a -> ByteString
renderBS = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderBS #-}

-- | Render to a lazy 'BSL.ByteString'
--
-- @since 0.1.0.0
renderBSL :: Render a => a -> BSL.ByteString
renderBSL :: forall a. Render a => a -> ByteString
renderBSL = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderBSL #-}

-- | Render to a @ByteString@ 'BSB.Builder'
--
-- @since 0.4.0.0
renderBSB :: Render a => a -> BSB.Builder
renderBSB :: forall a. Render a => a -> Builder
renderBSB = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderBSB #-}

-- | Render to a 'SBS.ShortByteString'
--
-- @since 0.4.0.0
renderSBS :: Render a => a -> SBS.ShortByteString
renderSBS :: forall a. Render a => a -> ShortByteString
renderSBS = forall a t. (Render a, Textual t) => a -> t
render
{-# INLINE renderSBS #-}

------------------------------------------------------------------------------
-- $RenderUtils

-- | Render a value to a textual data type using the 'Show' instance
--
-- @since 0.1.0.0
renderWithShow :: (Show a, Textual t) => a -> t
renderWithShow :: forall a t. (Show a, Textual t) => a -> t
renderWithShow = forall t t'. (Textual t, Textual t') => t' -> t
convert forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Show a => a -> String
show
{-# INLINE renderWithShow #-}

------------------------------------------------------------------------------
-- $Parse

-- | The 'Parse' type class parses a data type from a textual data type.
--
-- There are no default instances for the 'Parse' type class, so that all
-- instances can be customized per project when desired.  Instances for some
-- basic data types are defined for the 'ParseDefault' type class, however,
-- and you can load the 'Parse' instance as follows:
--
-- @
-- instance TTC.Parse Int
-- @
--
-- Since a type may have at most one instance of a given type class, special
-- care must be taken when defining type class instances in a shared library.
-- In particular, orphan instances should generally not be used in shared
-- libraries since they prevent users of the libraries from writing their own
-- instances.
--
-- See the @uname@ and @prompt@ example programs in the @examples@ directory.
--
-- For more details, see the following article:
-- <https://www.extrema.is/articles/ttc-textual-type-classes/render-and-parse>
--
-- @since 0.3.0.0
class Parse a where
  parse :: (Textual t, Textual e) => t -> Either e a

  default parse :: (Textual t, Textual e, ParseDefault a) => t -> Either e a
  parse = forall a t e.
(ParseDefault a, Textual t, Textual e) =>
t -> Either e a
parseDefault

-- This function is equivalent to 'parse' with the error type fixed to
-- 'String', used internally when the error is ignored.
--
-- @since 0.3.0.0
parse' :: (Parse a, Textual t) => t -> Either String a
parse' :: forall a t. (Parse a, Textual t) => t -> Either String a
parse' = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parse' #-}

------------------------------------------------------------------------------

-- | The 'ParseDefault' type class provides some default 'Parse' instances.
--
-- * The 'Char' instance parses single-character strings.
-- * Numeric type instances all parse using the 'Read' instance.
-- * Textual type instances all convert from the source 'Textual' data type.
--
-- @since 1.1.0.0
class ParseDefault a where
  parseDefault :: (Textual t, Textual e) => t -> Either e a

instance ParseDefault Char where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Char
parseDefault = forall t a. Textual t => (String -> a) -> t -> a
asS forall a b. (a -> b) -> a -> b
$ \case
    [Char
c] -> forall a b. b -> Either a b
Right Char
c
    String
_cs -> forall a b. a -> Either a b
Left forall a b. (a -> b) -> a -> b
$ forall t. Textual t => String -> t
fromS String
"invalid Char"

instance ParseDefault Double where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Double
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Double"

instance ParseDefault Float where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Float
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Float"

instance ParseDefault Int where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Int
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Int"

instance ParseDefault Int8 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Int8
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Int8"

instance ParseDefault Int16 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Int16
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Int16"

instance ParseDefault Int32 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Int32
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Int32"

instance ParseDefault Int64 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Int64
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Int64"

instance ParseDefault Integer where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Integer
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Integer"

instance ParseDefault Word where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Word
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Word"

instance ParseDefault Word8 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Word8
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Word8"

instance ParseDefault Word16 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Word16
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Word16"

instance ParseDefault Word32 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Word32
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Word32"

instance ParseDefault Word64 where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Word64
parseDefault = forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
"Word64"

instance ParseDefault String where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e String
parseDefault = forall a b. b -> Either a b
Right forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t'. Textual t' => t' -> String
toS

instance ParseDefault BSL.ByteString where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e ByteString
parseDefault = forall a b. b -> Either a b
Right forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t'. Textual t' => t' -> ByteString
toBSL

instance ParseDefault BS.ByteString where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e ByteString
parseDefault = forall a b. b -> Either a b
Right forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t'. Textual t' => t' -> ByteString
toBS

instance ParseDefault TL.Text where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Text
parseDefault = forall a b. b -> Either a b
Right forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t'. Textual t' => t' -> Text
toTL

instance ParseDefault T.Text where
  parseDefault :: forall t e. (Textual t, Textual e) => t -> Either e Text
parseDefault = forall a b. b -> Either a b
Right forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t'. Textual t' => t' -> Text
toT

------------------------------------------------------------------------------
-- $ParseSpecific
--
-- These functions are equivalent to 'parse', but they specify the type being
-- parsed from.  Use them to avoid having to write type annotations in cases
-- where the type is ambiguous.

-- | Parse from a 'String'
--
-- @since 0.3.0.0
parseS :: (Parse a, Textual e) => String -> Either e a
parseS :: forall a e. (Parse a, Textual e) => String -> Either e a
parseS = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseS #-}

-- | Parse from strict 'T.Text'
--
-- @since 0.3.0.0
parseT :: (Parse a, Textual e) => T.Text -> Either e a
parseT :: forall a e. (Parse a, Textual e) => Text -> Either e a
parseT = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseT #-}

-- | Parse from lazy 'TL.Text'
--
-- @since 0.3.0.0
parseTL :: (Parse a, Textual e) => TL.Text -> Either e a
parseTL :: forall a e. (Parse a, Textual e) => Text -> Either e a
parseTL = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseTL #-}

-- | Parse from a @Text@ 'TLB.Builder'
--
-- @since 1.1.0.0
parseTLB :: (Parse a, Textual e) => TLB.Builder -> Either e a
parseTLB :: forall a e. (Parse a, Textual e) => Builder -> Either e a
parseTLB = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseTLB #-}

-- | Parse from a 'ST.ShortText'
--
-- @since 1.4.0.0
parseST :: (Parse a, Textual e) => ST.ShortText -> Either e a
parseST :: forall a e. (Parse a, Textual e) => ShortText -> Either e a
parseST = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseST #-}

-- | Parse from a strict 'BS.ByteString'
--
-- @since 0.3.0.0
parseBS :: (Parse a, Textual e) => BS.ByteString -> Either e a
parseBS :: forall a e. (Parse a, Textual e) => ByteString -> Either e a
parseBS = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseBS #-}

-- | Parse from a lazy 'BSL.ByteString'
--
-- @since 0.3.0.0
parseBSL :: (Parse a, Textual e) => BSL.ByteString -> Either e a
parseBSL :: forall a e. (Parse a, Textual e) => ByteString -> Either e a
parseBSL = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseBSL #-}

-- | Parse from a @ByteString@ 'BSB.Builder'
--
-- @since 1.1.0.0
parseBSB :: (Parse a, Textual e) => BSB.Builder -> Either e a
parseBSB :: forall a e. (Parse a, Textual e) => Builder -> Either e a
parseBSB = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseBSB #-}

-- | Parse from a 'SBS.ShortByteString'
--
-- @since 1.1.0.0
parseSBS :: (Parse a, Textual e) => SBS.ShortByteString -> Either e a
parseSBS :: forall a e. (Parse a, Textual e) => ShortByteString -> Either e a
parseSBS = forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseSBS #-}

------------------------------------------------------------------------------
-- $ParseMaybe
--
-- The 'parseMaybe' function parses to a 'Maybe' type instead of an 'Either'
-- type.  The rest of the functions are equivalent to 'parseMaybe', but they
-- specify the type being parsed from.  Use them to avoid having to write type
-- annotations in cases where the type is ambiguous.

-- | Parse to a 'Maybe' type
--
-- @since 0.3.0.0
parseMaybe :: (Parse a, Textual t) => t -> Maybe a
parseMaybe :: forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe = forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either (forall a b. a -> b -> a
const forall a. Maybe a
Nothing) forall a. a -> Maybe a
Just forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a t. (Parse a, Textual t) => t -> Either String a
parse'
{-# INLINE parseMaybe #-}

-- | Parse from a 'String' to a 'Maybe' type
--
-- @since 0.3.0.0
parseMaybeS :: Parse a => String -> Maybe a
parseMaybeS :: forall a. Parse a => String -> Maybe a
parseMaybeS = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeS #-}

-- | Parse from strict 'T.Text' to a 'Maybe' type
--
-- @since 0.3.0.0
parseMaybeT :: Parse a => T.Text -> Maybe a
parseMaybeT :: forall a. Parse a => Text -> Maybe a
parseMaybeT = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeT #-}

-- | Parse from lazy 'TL.Text' to a 'Maybe' type
--
-- @since 0.3.0.0
parseMaybeTL :: Parse a => TL.Text -> Maybe a
parseMaybeTL :: forall a. Parse a => Text -> Maybe a
parseMaybeTL = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeTL #-}

-- | Parse from a @Text@ 'TLB.Builder' to a 'Maybe' type
--
-- @since 1.1.0.0
parseMaybeTLB :: Parse a => TLB.Builder -> Maybe a
parseMaybeTLB :: forall a. Parse a => Builder -> Maybe a
parseMaybeTLB = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeTLB #-}

-- | Parse from a 'ST.ShortText' to a 'Maybe' type
--
-- @since 1.4.0.0
parseMaybeST :: Parse a => ST.ShortText -> Maybe a
parseMaybeST :: forall a. Parse a => ShortText -> Maybe a
parseMaybeST = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeST #-}

-- | Parse from a strict 'BS.ByteString' to a 'Maybe' type
--
-- @since 0.3.0.0
parseMaybeBS :: Parse a => BS.ByteString -> Maybe a
parseMaybeBS :: forall a. Parse a => ByteString -> Maybe a
parseMaybeBS = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeBS #-}

-- | Parse from a lazy 'BSL.ByteString' to a 'Maybe' type
--
-- @since 0.3.0.0
parseMaybeBSL :: Parse a => BSL.ByteString -> Maybe a
parseMaybeBSL :: forall a. Parse a => ByteString -> Maybe a
parseMaybeBSL = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeBSL #-}

-- | Parse from a @ByteString@ 'BSB.Builder' to a 'Maybe' type
--
-- @since 1.1.0.0
parseMaybeBSB :: Parse a => BSB.Builder -> Maybe a
parseMaybeBSB :: forall a. Parse a => Builder -> Maybe a
parseMaybeBSB = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeBSB #-}

-- | Parse from a 'SBS.ShortByteString' to a 'Maybe' type
--
-- @since 1.1.0.0
parseMaybeSBS :: Parse a => SBS.ShortByteString -> Maybe a
parseMaybeSBS :: forall a. Parse a => ShortByteString -> Maybe a
parseMaybeSBS = forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe
{-# INLINE parseMaybeSBS #-}

------------------------------------------------------------------------------
-- $ParseOrFail
--
-- The 'parseOrFail' function fails using 'MonadFail' on error instead of
-- using an 'Either' type.  The rest of the functions are equivalent to
-- 'parseOrFail', but they specify the type being parsed from.  Use them to
-- avoid having to write type annotations in cases where the type is
-- ambiguous.

-- | Parse or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFail :: (MonadFail m, Parse a, Textual t) => t -> m a
parseOrFail :: forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail = forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either forall (m :: * -> *) a. MonadFail m => String -> m a
fail forall (f :: * -> *) a. Applicative f => a -> f a
pure forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseOrFail #-}

-- | Parse from a 'String' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailS :: (MonadFail m, Parse a) => String -> m a
parseOrFailS :: forall (m :: * -> *) a. (MonadFail m, Parse a) => String -> m a
parseOrFailS = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailS #-}

-- | Parse from strict 'T.Text' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailT :: (MonadFail m, Parse a) => T.Text -> m a
parseOrFailT :: forall (m :: * -> *) a. (MonadFail m, Parse a) => Text -> m a
parseOrFailT = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailT #-}

-- | Parse from lazy 'TL.Text' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailTL :: (MonadFail m, Parse a) => TL.Text -> m a
parseOrFailTL :: forall (m :: * -> *) a. (MonadFail m, Parse a) => Text -> m a
parseOrFailTL = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailTL #-}

-- | Parse from a @Text@ 'TLB.Builder' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailTLB :: (MonadFail m, Parse a) => TLB.Builder -> m a
parseOrFailTLB :: forall (m :: * -> *) a. (MonadFail m, Parse a) => Builder -> m a
parseOrFailTLB = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailTLB #-}

-- | Parse from a 'ST.ShortText' or fail using 'MonadFail'
--
-- @since 1.4.0.0
parseOrFailST :: (MonadFail m, Parse a) => ST.ShortText -> m a
parseOrFailST :: forall (m :: * -> *) a. (MonadFail m, Parse a) => ShortText -> m a
parseOrFailST = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailST #-}

-- | Parse from a strict 'BS.ByteString' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailBS :: (MonadFail m, Parse a) => BS.ByteString -> m a
parseOrFailBS :: forall (m :: * -> *) a. (MonadFail m, Parse a) => ByteString -> m a
parseOrFailBS = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailBS #-}

-- | Parse from a lazy 'BSL.ByteString' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailBSL :: (MonadFail m, Parse a) => BSL.ByteString -> m a
parseOrFailBSL :: forall (m :: * -> *) a. (MonadFail m, Parse a) => ByteString -> m a
parseOrFailBSL = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailBSL #-}

-- | Parse from a @ByteString@ 'BSB.Builder' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailBSB :: (MonadFail m, Parse a) => BSB.Builder -> m a
parseOrFailBSB :: forall (m :: * -> *) a. (MonadFail m, Parse a) => Builder -> m a
parseOrFailBSB = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailBSB #-}

-- | Parse from a 'SBS.ShortByteString' or fail using 'MonadFail'
--
-- @since 1.3.0.0
parseOrFailSBS :: (MonadFail m, Parse a) => SBS.ShortByteString -> m a
parseOrFailSBS :: forall (m :: * -> *) a.
(MonadFail m, Parse a) =>
ShortByteString -> m a
parseOrFailSBS = forall (m :: * -> *) a t.
(MonadFail m, Parse a, Textual t) =>
t -> m a
parseOrFail
{-# INLINE parseOrFailSBS #-}

------------------------------------------------------------------------------
-- $ParseUnsafe
--
-- The 'parseUnsafe' function raises an exception on error instead of using an
-- 'Either' type.  It should only be used when an error is not possible.  The
-- rest of the functions are equivalent to 'parseUnsafe', but they specify the
-- type being parsed from.  Use them to avoid having to write type annotations
-- in cases where the type is ambiguous.

-- | Unsafely parse
--
-- @since 0.1.0.0
parseUnsafe :: (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe :: forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe = forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either (forall a. HasCallStack => String -> a
error forall b c a. (b -> c) -> (a -> b) -> a -> c
. (String
"parseUnsafe: " forall a. [a] -> [a] -> [a]
++)) forall a. a -> a
id forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse
{-# INLINE parseUnsafe #-}

-- | Unsafely parse from a 'String'
--
-- @since 0.1.0.0
parseUnsafeS :: (HasCallStack, Parse a) => String -> a
parseUnsafeS :: forall a. (HasCallStack, Parse a) => String -> a
parseUnsafeS = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeS #-}

-- | Unsafely parse from strict 'T.Text'
--
-- @since 0.1.0.0
parseUnsafeT :: (HasCallStack, Parse a) => T.Text -> a
parseUnsafeT :: forall a. (HasCallStack, Parse a) => Text -> a
parseUnsafeT = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeT #-}

-- | Unsafely parse from lazy 'TL.Text'
--
-- @since 0.1.0.0
parseUnsafeTL :: (HasCallStack, Parse a) => TL.Text -> a
parseUnsafeTL :: forall a. (HasCallStack, Parse a) => Text -> a
parseUnsafeTL = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeTL #-}

-- | Unsafely parse from a @Text@ 'TLB.Builder'
--
-- @since 1.1.0.0
parseUnsafeTLB :: (HasCallStack, Parse a) => TLB.Builder -> a
parseUnsafeTLB :: forall a. (HasCallStack, Parse a) => Builder -> a
parseUnsafeTLB = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeTLB #-}

-- | Unsafely parse from a 'ST.ShortText'
--
-- @since 1.4.0.0
parseUnsafeST :: (HasCallStack, Parse a) => ST.ShortText -> a
parseUnsafeST :: forall a. (HasCallStack, Parse a) => ShortText -> a
parseUnsafeST = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeST #-}

-- | Unsafely parse from a strict 'BS.ByteString'
--
-- @since 0.1.0.0
parseUnsafeBS :: (HasCallStack, Parse a) => BS.ByteString -> a
parseUnsafeBS :: forall a. (HasCallStack, Parse a) => ByteString -> a
parseUnsafeBS = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeBS #-}

-- | Unsafely parse from a lazy 'BSL.ByteString'
--
-- @since 0.1.0.0
parseUnsafeBSL :: (HasCallStack, Parse a) => BSL.ByteString -> a
parseUnsafeBSL :: forall a. (HasCallStack, Parse a) => ByteString -> a
parseUnsafeBSL = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeBSL #-}

-- | Unsafely parse from a @ByteString@ 'BSB.Builder'
--
-- @since 1.1.0.0
parseUnsafeBSB :: (HasCallStack, Parse a) => BSB.Builder -> a
parseUnsafeBSB :: forall a. (HasCallStack, Parse a) => Builder -> a
parseUnsafeBSB = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeBSB #-}

-- | Unsafely parse from a 'SBS.ShortByteString'
--
-- @since 1.1.0.0
parseUnsafeSBS :: (HasCallStack, Parse a) => SBS.ShortByteString -> a
parseUnsafeSBS :: forall a. (HasCallStack, Parse a) => ShortByteString -> a
parseUnsafeSBS = forall a t. (HasCallStack, Parse a, Textual t) => t -> a
parseUnsafe
{-# INLINE parseUnsafeSBS #-}

------------------------------------------------------------------------------
-- $ParseWithASingleErrorMessage
--
-- The 'withError' function takes an error message and a 'Maybe' value.  It
-- returns a 'Parse' result: the error when the 'Maybe' value is 'Nothing', or
-- the value inside the 'Just'.  This provides a convenient way to return the
-- same error message for any parse error.  The rest of the functions are
-- equivalent to 'withError', but they specify the type of the error message.
-- Use them to avoid having to write type annotations in cases where the type
-- is ambiguous.

-- | Create a 'Parse' result from a 'Textual' error message and a 'Maybe'
-- value
--
-- @since 1.2.0.0
withError
  :: (Textual e', Textual e)
  => e'
  -> Maybe a
  -> Either e a
withError :: forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError e'
err = forall b a. b -> (a -> b) -> Maybe a -> b
maybe (forall a b. a -> Either a b
Left forall a b. (a -> b) -> a -> b
$ forall t t'. (Textual t, Textual t') => t' -> t
convert e'
err) forall a b. b -> Either a b
Right
{-# INLINE withError #-}

-- | Create a 'Parse' result from a 'String' error message and a 'Maybe' value
--
-- @since 1.2.0.0
withErrorS
  :: Textual e
  => String
  -> Maybe a
  -> Either e a
withErrorS :: forall e a. Textual e => String -> Maybe a -> Either e a
withErrorS = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorS #-}

-- | Create a 'Parse' result from a 'T.Text' error message and a 'Maybe' value
--
-- @since 1.2.0.0
withErrorT
  :: Textual e
  => T.Text
  -> Maybe a
  -> Either e a
withErrorT :: forall e a. Textual e => Text -> Maybe a -> Either e a
withErrorT = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorT #-}

-- | Create a 'Parse' result from a 'TL.Text' error message and a 'Maybe'
-- value
--
-- @since 1.2.0.0
withErrorTL
  :: Textual e
  => TL.Text
  -> Maybe a
  -> Either e a
withErrorTL :: forall e a. Textual e => Text -> Maybe a -> Either e a
withErrorTL = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorTL #-}

-- | Create a 'Parse' result from a 'TLB.Builder' error message and a 'Maybe'
-- value
--
-- @since 1.2.0.0
withErrorTLB
  :: Textual e
  => TLB.Builder
  -> Maybe a
  -> Either e a
withErrorTLB :: forall e a. Textual e => Builder -> Maybe a -> Either e a
withErrorTLB = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorTLB #-}

-- | Create a 'Parse' result from a 'ST.ShortText' error message and a 'Maybe'
-- value
--
-- @since 1.4.0.0
withErrorST
  :: Textual e
  => ST.ShortText
  -> Maybe a
  -> Either e a
withErrorST :: forall e a. Textual e => ShortText -> Maybe a -> Either e a
withErrorST = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorST #-}

-- | Create a 'Parse' result from a 'BS.ByteString' error message and a
-- 'Maybe' value
--
-- @since 1.2.0.0
withErrorBS
  :: Textual e
  => BS.ByteString
  -> Maybe a
  -> Either e a
withErrorBS :: forall e a. Textual e => ByteString -> Maybe a -> Either e a
withErrorBS = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorBS #-}

-- | Create a 'Parse' result from a 'BSL.ByteString' error message and a
-- 'Maybe' value
--
-- @since 1.2.0.0
withErrorBSL
  :: Textual e
  => BSL.ByteString
  -> Maybe a
  -> Either e a
withErrorBSL :: forall e a. Textual e => ByteString -> Maybe a -> Either e a
withErrorBSL = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorBSL #-}

-- | Create a 'Parse' result from a 'BSB.Builder' error message and a
-- 'Maybe' value
--
-- @since 1.2.0.0
withErrorBSB
  :: Textual e
  => BSB.Builder
  -> Maybe a
  -> Either e a
withErrorBSB :: forall e a. Textual e => Builder -> Maybe a -> Either e a
withErrorBSB = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorBSB #-}

-- | Create a 'Parse' result from a 'SBS.ShortByteString' error message and a
-- 'Maybe' value
--
-- @since 1.2.0.0
withErrorSBS
  :: Textual e
  => SBS.ShortByteString
  -> Maybe a
  -> Either e a
withErrorSBS :: forall e a. Textual e => ShortByteString -> Maybe a -> Either e a
withErrorSBS = forall e' e a.
(Textual e', Textual e) =>
e' -> Maybe a -> Either e a
withError
{-# INLINE withErrorSBS #-}

------------------------------------------------------------------------------
-- $ParseWithAnErrorPrefix
--
-- The 'prefixError' function adds a common prefix to error messages of a
-- 'Parse' result.  The rest of the functions are equivalent to 'prefixError',
-- but they specify the type of the error message.  Use them to avoid having
-- to write type annotations in cases where the type is ambiguous.

-- | Add a prefix to 'Textual' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixError
  :: (Monoid e', Textual e', Textual e)
  => e'
  -> Either e' a
  -> Either e a
prefixError :: forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError e'
prefix = forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either (forall a b. a -> Either a b
Left forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t t'. (Textual t, Textual t') => t' -> t
convert forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Monoid a => a -> a -> a
mappend e'
prefix) forall a b. b -> Either a b
Right
{-# INLINE prefixError #-}

-- | Add a prefix to 'String' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorS
  :: Textual e
  => String
  -> Either String a
  -> Either e a
prefixErrorS :: forall e a. Textual e => String -> Either String a -> Either e a
prefixErrorS = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorS #-}

-- | Add a prefix to 'T.Text' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorT
  :: Textual e
  => T.Text
  -> Either T.Text a
  -> Either e a
prefixErrorT :: forall e a. Textual e => Text -> Either Text a -> Either e a
prefixErrorT = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorT #-}

-- | Add a prefix to 'TL.Text' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorTL
  :: Textual e
  => TL.Text
  -> Either TL.Text a
  -> Either e a
prefixErrorTL :: forall e a. Textual e => Text -> Either Text a -> Either e a
prefixErrorTL = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorTL #-}

-- | Add a prefix to 'TLB.Builder' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorTLB
  :: Textual e
  => TLB.Builder
  -> Either TLB.Builder a
  -> Either e a
prefixErrorTLB :: forall e a. Textual e => Builder -> Either Builder a -> Either e a
prefixErrorTLB = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorTLB #-}

-- | Add a prefix to 'ST.ShortText' error messages of a 'Parse' result
--
-- @since 1.4.0.0
prefixErrorST
  :: Textual e
  => ST.ShortText
  -> Either ST.ShortText a
  -> Either e a
prefixErrorST :: forall e a.
Textual e =>
ShortText -> Either ShortText a -> Either e a
prefixErrorST = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorST #-}

-- | Add a prefix to 'BS.ByteString' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorBS
  :: Textual e
  => BS.ByteString
  -> Either BS.ByteString a
  -> Either e a
prefixErrorBS :: forall e a.
Textual e =>
ByteString -> Either ByteString a -> Either e a
prefixErrorBS = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorBS #-}

-- | Add a prefix to 'BSL.ByteString' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorBSL
  :: Textual e
  => BSL.ByteString
  -> Either BSL.ByteString a
  -> Either e a
prefixErrorBSL :: forall e a.
Textual e =>
ByteString -> Either ByteString a -> Either e a
prefixErrorBSL = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorBSL #-}

-- | Add a prefix to 'BSB.Builder' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorBSB
  :: Textual e
  => BSB.Builder
  -> Either BSB.Builder a
  -> Either e a
prefixErrorBSB :: forall e a. Textual e => Builder -> Either Builder a -> Either e a
prefixErrorBSB = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorBSB #-}

-- | Add a prefix to 'SBS.ShortByteString' error messages of a 'Parse' result
--
-- @since 1.2.0.0
prefixErrorSBS
  :: Textual e
  => SBS.ShortByteString
  -> Either SBS.ShortByteString a
  -> Either e a
prefixErrorSBS :: forall e a.
Textual e =>
ShortByteString -> Either ShortByteString a -> Either e a
prefixErrorSBS = forall e' e a.
(Monoid e', Textual e', Textual e) =>
e' -> Either e' a -> Either e a
prefixError
{-# INLINE prefixErrorSBS #-}

------------------------------------------------------------------------------
-- $ParseEnums

-- | Parse a value in an enumeration
--
-- This function is intended to be used with types that have few choices, as
-- the implementation uses a linear algorithm.
--
-- See the @enum@ example program in the @examples@ directory.
--
-- @since 0.1.0.0
parseEnum
  :: (Bounded a, Enum a, Render a, Textual t)
  => Bool        -- ^ case-insensitive when 'True'
  -> Bool        -- ^ accept unique prefixes when 'True'
  -> e           -- ^ invalid input error
  -> e           -- ^ ambiguous input error
  -> t           -- ^ textual input to parse
  -> Either e a  -- ^ error or parsed value
parseEnum :: forall a t e.
(Bounded a, Enum a, Render a, Textual t) =>
Bool -> Bool -> e -> e -> t -> Either e a
parseEnum Bool
allowCI Bool
allowPrefix e
invalidError e
ambiguousError t
t =
    let t' :: Text
t' = Text -> Text
norm forall a b. (a -> b) -> a -> b
$ forall t'. Textual t' => t' -> Text
toT t
t
    in  case [a
v | a
v <- [forall a. Bounded a => a
minBound ..], Text
t' Text -> Text -> Bool
`match` Text -> Text
norm (forall a t. (Render a, Textual t) => a -> t
render a
v)] of
          [a
v] -> forall a b. b -> Either a b
Right a
v
          []  -> forall a b. a -> Either a b
Left e
invalidError
          [a]
_vs -> forall a b. a -> Either a b
Left e
ambiguousError
  where
    norm :: T.Text -> T.Text
    norm :: Text -> Text
norm = if Bool
allowCI then Text -> Text
T.toLower else forall a. a -> a
id

    match :: T.Text -> T.Text -> Bool
    match :: Text -> Text -> Bool
match = if Bool
allowPrefix then Text -> Text -> Bool
T.isPrefixOf else forall a. Eq a => a -> a -> Bool
(==)

-- | Parse a value in an enumeration, with 'Textual' error messages
--
-- The following English error messages are returned:
--
-- * \"invalid {name}\" when there are no matches
-- * \"ambiguous {name}\" when there is more than one match
--
-- @since 0.4.0.0
parseEnum'
  :: (Bounded a, Enum a, Render a, Textual t, Textual e)
  => String      -- ^ name to include in error messages
  -> Bool        -- ^ case-insensitive when 'True'
  -> Bool        -- ^ accept unique prefixes when 'True'
  -> t           -- ^ textual input to parse
  -> Either e a  -- ^ error or parsed value
parseEnum' :: forall a t e.
(Bounded a, Enum a, Render a, Textual t, Textual e) =>
String -> Bool -> Bool -> t -> Either e a
parseEnum' String
name Bool
allowCI Bool
allowPrefix =
    forall a t e.
(Bounded a, Enum a, Render a, Textual t) =>
Bool -> Bool -> e -> e -> t -> Either e a
parseEnum
      Bool
allowCI Bool
allowPrefix
      (forall t. Textual t => String -> t
fromS forall a b. (a -> b) -> a -> b
$ String
"invalid " forall a. [a] -> [a] -> [a]
++ String
name)
      (forall t. Textual t => String -> t
fromS forall a b. (a -> b) -> a -> b
$ String
"ambiguous " forall a. [a] -> [a] -> [a]
++ String
name)
{-# INLINEABLE parseEnum' #-}

------------------------------------------------------------------------------
-- $ReadInstanced

-- | Parse a value using the 'Read' instance
--
-- @since 0.1.0.0
parseWithRead
  :: (Read a, Textual t)
  => e           -- ^ invalid input error
  -> t           -- ^ textual input to parse
  -> Either e a  -- ^ error or parsed value
parseWithRead :: forall a t e. (Read a, Textual t) => e -> t -> Either e a
parseWithRead e
invalidError = forall b a. b -> (a -> b) -> Maybe a -> b
maybe (forall a b. a -> Either a b
Left e
invalidError) forall a b. b -> Either a b
Right forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Read a => String -> Maybe a
readMaybe forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t'. Textual t' => t' -> String
toS
{-# INLINEABLE parseWithRead #-}

-- | Parse a value using the 'Read' instance, with 'Textual' error messages
--
-- The following English error message is returned:
--
-- * \"invalid {name}\" when the parse fails
--
-- @since 0.3.0.0
parseWithRead'
  :: (Read a, Textual t, Textual e)
  => String      -- ^ name to include in error messages
  -> t           -- ^ textual input to parse
  -> Either e a  -- ^ error or parsed value
parseWithRead' :: forall a t e.
(Read a, Textual t, Textual e) =>
String -> t -> Either e a
parseWithRead' String
name = forall a t e. (Read a, Textual t) => e -> t -> Either e a
parseWithRead (forall t. Textual t => String -> t
fromS forall a b. (a -> b) -> a -> b
$ String
"invalid " forall a. [a] -> [a] -> [a]
++ String
name)
{-# INLINEABLE parseWithRead' #-}

-- | Parse a value to a 'Maybe' type using the 'Read' instance
--
-- @since 0.3.0.0
maybeParseWithRead
  :: (Read a, Textual t)
  => t        -- ^ textual input to parse
  -> Maybe a  -- ^ parsed value or 'Nothing' if invalid
maybeParseWithRead :: forall a t. (Read a, Textual t) => t -> Maybe a
maybeParseWithRead = forall a. Read a => String -> Maybe a
readMaybe forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall t'. Textual t' => t' -> String
toS

-- | Implement 'ReadS' using 'parseEnum'
--
-- This implementation expects all of the input to be consumed.
--
-- @since 0.1.0.0
readsEnum
  :: (Bounded a, Enum a, Render a)
  => Bool  -- ^ case-insensitive when 'True'
  -> Bool  -- ^ accept unique prefixes when 'True'
  -> ReadS a
readsEnum :: forall a. (Bounded a, Enum a, Render a) => Bool -> Bool -> ReadS a
readsEnum Bool
allowCI Bool
allowPrefix String
s =
    case forall a t e.
(Bounded a, Enum a, Render a, Textual t) =>
Bool -> Bool -> e -> e -> t -> Either e a
parseEnum Bool
allowCI Bool
allowPrefix () () String
s of
      Right a
v -> [(a
v, String
"")]
      Left{}  -> []
{-# INLINEABLE readsEnum #-}

-- | Implement 'ReadS' using a 'Parse' instance
--
-- This implementation expects all of the input to be consumed.
--
-- @since 0.3.0.0
readsWithParse
  :: Parse a
  => ReadS a
readsWithParse :: forall a. Parse a => ReadS a
readsWithParse String
s = case forall a t. (Parse a, Textual t) => t -> Maybe a
parseMaybe String
s of
    Just a
v  -> [(a
v, String
"")]
    Maybe a
Nothing -> []
{-# INLINEABLE readsWithParse #-}

------------------------------------------------------------------------------
-- $ParseValid
--
-- The follow functions provide a number of ways to use a 'Parse' instance to
-- validate constants at compile-time.
--
-- If you can use Template Haskell typed expressions in your project, use
-- 'valid', 'mkValid', or 'validOf'.  Use 'valid' to define constants for
-- types that have a 'THS.Lift' instance.  For types that do not have a
-- 'THS.Lift' instance, use 'mkValid' to define a validation function for that
-- type using a 'Proxy', or use 'validOf' to pass the 'Proxy' when defining
-- constants.
--
-- Typed expressions were not supported in @haskell-src-exts <1.22.0@, which
-- causes problems with old versions of @hlint@.  If the issue affects you,
-- you may use 'mkUntypedValid', 'mkUntypedValidQQ', or 'untypedValidOf'
-- instead of the above functions.  Use 'mkUntypedValid' to define a
-- validation function for a type using a 'Proxy', or use 'untypedValidOf' to
-- pass the 'Proxy' when defining constants.  Alternatively, use
-- 'mkUntypedValidQQ' to define a validation quasi-quoter.
--
-- For more details, see the following article:
-- <https://www.extrema.is/articles/ttc-textual-type-classes/validated-constants>

-- | Validate a constant at compile-time using a 'Parse' instance
--
-- This function parses the 'String' at compile-time and fails compilation on
-- error.  When valid, the result is compiled in, so the result type must have
-- a 'THS.Lift' instance.  When this is inconvenient, use one of the
-- alternative functions in this library.
--
-- This function uses a Template Haskell typed expression.  Typed expressions
-- were not supported in @haskell-src-exts <1.22.0@, which causes problems
-- with old versions of @hlint@.  If the issue affects you, use
-- @hlint -i "Parse error"@ to ignore parse errors or use one of the
-- alternative functions in this library.
--
-- Note that the typed Template Haskell API changed in GHC 9.  The type
-- displayed in this documentation is determined by the version of GHC used to
-- build the documentation.
--
-- The type of this function in GHC 9 or later is as follows:
--
-- @
-- valid
--   :: (MonadFail m, THS.Quote m, Parse a, THS.Lift a)
--   => String
--   -> THS.Code m a
-- @
--
-- The type of this function in previous versions of GHC is as follows:
--
-- @
-- valid
--   :: (Parse a, THS.Lift a)
--   => String
--   -> TH.Q (TH.TExp a)
-- @
--
-- This function is used the same way in all GHC versions.  See the @valid@,
-- @invalid@, and @lift@ example programs in the @examples@ directory.  The
-- following is example usage from the @valid@ example:
--
-- @
-- sample :: Username
-- sample = $$(TTC.valid "tcard")
-- @
--
-- @since 0.1.0.0
#if __GLASGOW_HASKELL__ >= 900
valid
  :: (MonadFail m, THS.Quote m, Parse a, THS.Lift a)
  => String
  -> THS.Code m a
valid :: forall (m :: * -> *) a.
(MonadFail m, Quote m, Parse a, Lift a) =>
String -> Code m a
valid String
s = case forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse String
s of
    Right a
x -> [|| x ||]
    Left String
err -> forall (m :: * -> *) a. m (TExp a) -> Code m a
THS.Code forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (m :: * -> *) a. MonadFail m => String -> m a
fail forall a b. (a -> b) -> a -> b
$ String
"Invalid constant: " forall a. [a] -> [a] -> [a]
++ String
err
#else
valid
  :: (Parse a, THS.Lift a)
  => String
  -> TH.Q (TH.TExp a)
valid s = case parse s of
    Right x -> [|| x ||]
    Left err -> fail $ "Invalid constant: " ++ err
#endif

-- | This instance enables use of 'valid' without having to type @valid@.  The
-- [OverloadedStrings](https://ghc.gitlab.haskell.org/ghc/doc/users_guide/exts/overloaded_strings.html)
-- extension must be enabled in the module where this functionality is used.
-- Note that this reduces the number of characters in the code, but it can
-- also make the code more difficult to understand by somebody who is not
-- already familiar with it.  Typing @valid@ gives people a way to investigate
-- and understand what is going on.
--
-- Note that the typed Template Haskell API changed in GHC 9.  The type
-- displayed in this documentation is determined by the version of GHC used to
-- build the documentation.
--
-- The type of this instance in GHC 9 or later is as follows:
--
-- @
-- (MonadFail m, THS.Quote m, Parse a, THS.Lift a) => IsString (THS.Code m a)
-- @
--
-- The type of this instance in previous versions of GHC is as follows:
--
-- @
-- (Parse a, THS.Lift a) => IsString (TH.Q (TH.TExp a))
-- @
--
-- This functionality can be used as follows in all supported versions of GHC.
-- The following is example usage from the @valid@ example:
--
-- @
-- sample2 :: Username
-- sample2 = $$("alice")
-- @
--
-- The parenthesis are not required from GHC 9.  The following is example
-- usage from the @valid@ example:
--
-- @
-- sample2 :: Username
-- sample2 = $$"alice"
-- @
--
-- @since 1.3.0.0
#if __GLASGOW_HASKELL__ >= 900
instance (MonadFail m, THS.Quote m, Parse a, THS.Lift a)
    => IsString (THS.Code m a) where
  fromString :: String -> Code m a
fromString = forall (m :: * -> *) a.
(MonadFail m, Quote m, Parse a, Lift a) =>
String -> Code m a
valid
#else
instance (Parse a, THS.Lift a) => IsString (TH.Q (TH.TExp a)) where
  fromString = valid
#endif

-- | Validate a constant at compile-time using a 'Parse' instance
--
-- This function requires a 'Proxy' of the result type.  Use 'mkValid' to
-- avoid having to pass a 'Proxy' during constant definition.
--
-- This function parses the 'String' at compile-time and fails compilation on
-- error.  When valid, the 'String' is compiled in, to be parsed again at
-- run-time.  Since the result is not compiled in, no 'THS.Lift' instance is
-- required.
--
-- This function uses a Template Haskell typed expression.  Typed expressions
-- were not supported in @haskell-src-exts <1.22.0@, which causes problems
-- with old versions of @hlint@.  If the issue affects you, use
-- @hlint -i "Parse error"@ to ignore parse errors or use 'untypedValidOf'
-- instead.
--
-- Note that the typed Template Haskell API changed in GHC 9.  The type
-- displayed in this documentation is determined by the version of GHC used to
-- build the documentation.
--
-- The type of this function in GHC 9 or later is as follows:
--
-- @
-- validOf
--   :: (MonadFail m, THS.Quote m, Parse a)
--   => Proxy a
--   -> String
--   -> THS.Code m a
-- @
--
-- The type of this function in previous versions of GHC is as follows:
--
-- @
-- validOf
--   :: Parse a
--   => Proxy a
--   -> String
--   -> TH.Q (TH.TExp a)
-- @
--
-- This function is used the same way in all GHC versions.  See the @validof@
-- example program in the @examples@ directory.  The following is example
-- usage from the @validof@ example:
--
-- @
-- sample :: Username
-- sample = $$(TTC.validOf (Proxy :: Proxy Username) "tcard")
-- @
--
-- @since 0.1.0.0
#if __GLASGOW_HASKELL__ >= 900
validOf
  :: (MonadFail m, THS.Quote m, Parse a)
  => Proxy a
  -> String
  -> THS.Code m a
validOf :: forall (m :: * -> *) a.
(MonadFail m, Quote m, Parse a) =>
Proxy a -> String -> Code m a
validOf Proxy a
proxy String
s = case (forall a (proxy :: * -> *). a -> proxy a -> a
`asProxyTypeOf` Proxy a
proxy) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse String
s of
    Right{} -> [|| parseUnsafeS s ||]
    Left String
err -> forall (m :: * -> *) a. m (TExp a) -> Code m a
THS.Code forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (m :: * -> *) a. MonadFail m => String -> m a
fail forall a b. (a -> b) -> a -> b
$ String
"Invalid constant: " forall a. [a] -> [a] -> [a]
++ String
err
#else
validOf
  :: Parse a
  => Proxy a
  -> String
  -> TH.Q (TH.TExp a)
validOf proxy s = case (`asProxyTypeOf` proxy) <$> parse s of
    Right{} -> [|| parseUnsafeS s ||]
    Left err -> fail $ "Invalid constant: " ++ err
#endif

-- | Make a @valid@ function using 'validOf' for the given type
--
-- Create a @valid@ function for a type in order to avoid having to write a
-- 'Proxy' when defining constants.
--
-- This function uses a Template Haskell typed expression.  Typed expressions
-- were not supported in @haskell-src-exts <1.22.0@, which causes problems
-- with old versions of @hlint@.  If the issue affects you, use
-- @hlint -i "Parse error"@ to ignore parse errors or use 'mkUntypedValid'
-- instead.
--
-- Note that the typed Template Haskell API changed in GHC 9.  The type
-- displayed in this documentation is determined by the version of GHC used to
-- build the documentation.
--
-- The type of the created @valid@ function in GHC 9 or later is as follows:
--
-- @
-- \$funName
--   :: forall m. (MonadFail m, THS.Quote m)
--   => String
--   -> THS.Code m $resultType
-- @
--
-- The type of the created @valid@ function in previous versions of GHC is as
-- follows:
--
-- @
-- \$funName
--   :: String
--   -> TH.Q (TH.TExp $resultType)
-- @
--
-- This function is used the same way in all GHC versions.  See the @mkvalid@
-- example program in the @examples@ directory.  The following is example
-- usage from the @mkvalid@ example:
--
-- @
-- \$(TTC.mkValid "valid" ''Username)
-- @
--
-- The created @valid@ function can then be used as follows:
--
-- @
-- sample :: Username
-- sample = $$(Username.valid "tcard")
-- @
--
-- @since 0.1.0.0
mkValid
  :: String
  -> TH.Name
  -> TH.DecsQ
mkValid :: String -> Name -> DecsQ
mkValid String
funName Name
typeName = do
    let funName' :: Name
funName' = String -> Name
TH.mkName String
funName
        resultType :: Q Type
resultType = forall (f :: * -> *) a. Applicative f => a -> f a
pure forall a b. (a -> b) -> a -> b
$ Name -> Type
TH.ConT Name
typeName
#if __GLASGOW_HASKELL__ >= 900
    Type
funType <-
      [t|
        forall m . (MonadFail m, THS.Quote m) =>
          String -> THS.Code m $resultType
        |]
#else
    funType <- [t| String -> TH.Q (TH.TExp $resultType) |]
#endif
    Exp
body <- [| validOf (Proxy :: Proxy $resultType) |]
    forall (m :: * -> *) a. Monad m => a -> m a
return
      [ Name -> Type -> Dec
TH.SigD Name
funName' Type
funType
      , Name -> [Clause] -> Dec
TH.FunD Name
funName' [[Pat] -> Body -> [Dec] -> Clause
TH.Clause [] (Exp -> Body
TH.NormalB Exp
body) []]
      ]

-- | Validate a constant at compile-time using a 'Parse' instance
--
-- This function requires a 'Proxy' of the result type.  Use 'mkUntypedValid'
-- to avoid having to pass a 'Proxy' during constant definition.
--
-- This function parses the 'String' at compile-time and fails compilation on
-- error.  When valid, the 'String' is compiled in, to be parsed again at
-- run-time.  Since the result is not compiled in, no 'THS.Lift' instance is
-- required.
--
-- See the @uvalidof@ example program in the @examples@ directory.  The
-- following is example usage from the @uvalidof@ example:
--
-- @
-- sample :: Username
-- sample = $(TTC.untypedValidOf (Proxy :: Proxy Username) "tcard")
-- @
--
-- @since 0.2.0.0
untypedValidOf
  :: Parse a
  => Proxy a
  -> String
  -> TH.ExpQ
untypedValidOf :: forall a. Parse a => Proxy a -> String -> ExpQ
untypedValidOf Proxy a
proxy String
s = case (forall a (proxy :: * -> *). a -> proxy a -> a
`asProxyTypeOf` Proxy a
proxy) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a t e. (Parse a, Textual t, Textual e) => t -> Either e a
parse String
s of
    Right{} -> [| parseUnsafeS s |]
    Left String
err -> forall (m :: * -> *) a. MonadFail m => String -> m a
fail forall a b. (a -> b) -> a -> b
$ String
"Invalid constant: " forall a. [a] -> [a] -> [a]
++ String
err

-- | Make a @valid@ function using 'untypedValidOf' for the given type
--
-- Create a @valid@ function for a type in order to avoid having to write a
-- 'Proxy' when defining constants.
--
-- See the @mkuvalid@ example program in the @examples@ directory.  The
-- following is example usage from the @mkuvalid@ example:
--
-- @
-- \$(TTC.mkUntypedValid "valid" ''Username)
-- @
--
-- The created @valid@ function can then be used as follows:
--
-- @
-- sample :: Username
-- sample = $(Username.valid "tcard")
-- @
--
-- @since 0.2.0.0
mkUntypedValid
  :: String
  -> TH.Name
  -> TH.DecsQ
mkUntypedValid :: String -> Name -> DecsQ
mkUntypedValid String
funName Name
typeName = do
    let funName' :: Name
funName' = String -> Name
TH.mkName String
funName
        resultType :: Q Type
resultType = forall (f :: * -> *) a. Applicative f => a -> f a
pure forall a b. (a -> b) -> a -> b
$ Name -> Type
TH.ConT Name
typeName
    Type
funType <- [t| String -> TH.ExpQ |]
    Exp
body <- [| untypedValidOf (Proxy :: Proxy $resultType) |]
    forall (m :: * -> *) a. Monad m => a -> m a
return
      [ Name -> Type -> Dec
TH.SigD Name
funName' Type
funType
      , Name -> [Clause] -> Dec
TH.FunD Name
funName' [[Pat] -> Body -> [Dec] -> Clause
TH.Clause [] (Exp -> Body
TH.NormalB Exp
body) []]
      ]

-- | Make a @valid@ quasi-quoter using 'untypedValidOf' for the given type
--
-- See the @uvalidqq@ example program in the @examples@ directory.  The
-- following is example usage from the @uvalidqq@ example:
--
-- @
-- \$(TTC.mkUntypedValidQQ "valid" ''Username)
-- @
--
-- The created @valid@ function can then be used as follows:
--
-- @
-- sample :: Username
-- sample = [Username.valid|tcard|]
-- @
--
-- @since 0.2.0.0
mkUntypedValidQQ
  :: String
  -> TH.Name
  -> TH.DecsQ
mkUntypedValidQQ :: String -> Name -> DecsQ
mkUntypedValidQQ String
funName Name
typeName = do
    let funName' :: Name
funName' = String -> Name
TH.mkName String
funName
        resultType :: Q Type
resultType = forall (f :: * -> *) a. Applicative f => a -> f a
pure forall a b. (a -> b) -> a -> b
$ Name -> Type
TH.ConT Name
typeName
    Exp
expE <- [| untypedValidOf (Proxy :: Proxy $resultType) |]
    Exp
expP <- [| error "pattern not supported" |]
    Exp
expT <- [| error "type not supported" |]
    Exp
expD <- [| error "declaration not supported" |]
    let body :: Body
body = Exp -> Body
TH.NormalB forall a b. (a -> b) -> a -> b
$ Name -> [FieldExp] -> Exp
TH.RecConE 'Q.QuasiQuoter
          [ ('Q.quoteExp, Exp
expE)
          , ('Q.quotePat, Exp
expP)
          , ('Q.quoteType, Exp
expT)
          , ('Q.quoteDec, Exp
expD)
          ]
    forall (m :: * -> *) a. Monad m => a -> m a
return
      [ Name -> Type -> Dec
TH.SigD Name
funName' forall a b. (a -> b) -> a -> b
$ Name -> Type
TH.ConT ''Q.QuasiQuoter
      , Name -> [Clause] -> Dec
TH.FunD Name
funName' [[Pat] -> Body -> [Dec] -> Clause
TH.Clause [] Body
body []]
      ]