{- hlint ignore "Avoid restricted flags" -}
module Rattletrap.Utility.Json
  ( module Rattletrap.Utility.Json,
    Aeson.FromJSON (parseJSON),
    Key.Key,
    Aeson.ToJSON (toJSON),
    Aeson.Value,
    Aeson.encode,
    Aeson.object,
    Aeson.withObject,
    Aeson.withText,
  )
where

import qualified Data.Aeson as Aeson
import qualified Data.Aeson.Encode.Pretty as Aeson
import qualified Data.Aeson.Key as Key
import qualified Data.Aeson.Types as Aeson
import qualified Data.ByteString as ByteString
import qualified Data.ByteString.Lazy as LazyByteString

keyToString :: Key.Key -> String
keyToString :: Key -> String
keyToString = Key -> String
Key.toString

required ::
  (Aeson.FromJSON value) => Aeson.Object -> String -> Aeson.Parser value
required :: forall value. FromJSON value => Object -> String -> Parser value
required Object
object String
key = Object
object forall a. FromJSON a => Object -> Key -> Parser a
Aeson..: String -> Key
Key.fromString String
key

optional ::
  (Aeson.FromJSON value) =>
  Aeson.Object ->
  String ->
  Aeson.Parser (Maybe value)
optional :: forall value.
FromJSON value =>
Object -> String -> Parser (Maybe value)
optional Object
object String
key = Object
object forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Aeson..:? String -> Key
Key.fromString String
key

pair :: (Aeson.ToJSON value, Aeson.KeyValue pair) => String -> value -> pair
pair :: forall value pair.
(ToJSON value, KeyValue pair) =>
String -> value -> pair
pair String
key value
value = String -> Key
Key.fromString String
key forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Aeson..= value
value

decode :: (Aeson.FromJSON a) => ByteString.ByteString -> Either String a
decode :: forall a. FromJSON a => ByteString -> Either String a
decode = forall a. FromJSON a => ByteString -> Either String a
Aeson.eitherDecodeStrict'

encodePretty :: (Aeson.ToJSON a) => a -> LazyByteString.ByteString
encodePretty :: forall a. ToJSON a => a -> ByteString
encodePretty =
  forall a. ToJSON a => Config -> a -> ByteString
Aeson.encodePretty'
    Config
Aeson.defConfig
      { confCompare :: Text -> Text -> Ordering
Aeson.confCompare = forall a. Ord a => a -> a -> Ordering
compare,
        confIndent :: Indent
Aeson.confIndent = Indent
Aeson.Tab,
        confTrailingNewline :: Bool
Aeson.confTrailingNewline = Bool
True
      }