{-# LANGUAGE DeriveGeneric         #-}
{-# LANGUAGE DuplicateRecordFields #-}

module HaskellWorks.Polysemy.Error.Types.JsonDecodeError
  ( JsonDecodeError(..)
  ) where

import           HaskellWorks.Prelude

newtype JsonDecodeError =
  JsonDecodeError
  { JsonDecodeError -> String
message :: String
  }
  deriving (JsonDecodeError -> JsonDecodeError -> Bool
(JsonDecodeError -> JsonDecodeError -> Bool)
-> (JsonDecodeError -> JsonDecodeError -> Bool)
-> Eq JsonDecodeError
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: JsonDecodeError -> JsonDecodeError -> Bool
== :: JsonDecodeError -> JsonDecodeError -> Bool
$c/= :: JsonDecodeError -> JsonDecodeError -> Bool
/= :: JsonDecodeError -> JsonDecodeError -> Bool
Eq, (forall x. JsonDecodeError -> Rep JsonDecodeError x)
-> (forall x. Rep JsonDecodeError x -> JsonDecodeError)
-> Generic JsonDecodeError
forall x. Rep JsonDecodeError x -> JsonDecodeError
forall x. JsonDecodeError -> Rep JsonDecodeError x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. JsonDecodeError -> Rep JsonDecodeError x
from :: forall x. JsonDecodeError -> Rep JsonDecodeError x
$cto :: forall x. Rep JsonDecodeError x -> JsonDecodeError
to :: forall x. Rep JsonDecodeError x -> JsonDecodeError
Generic, Int -> JsonDecodeError -> ShowS
[JsonDecodeError] -> ShowS
JsonDecodeError -> String
(Int -> JsonDecodeError -> ShowS)
-> (JsonDecodeError -> String)
-> ([JsonDecodeError] -> ShowS)
-> Show JsonDecodeError
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> JsonDecodeError -> ShowS
showsPrec :: Int -> JsonDecodeError -> ShowS
$cshow :: JsonDecodeError -> String
show :: JsonDecodeError -> String
$cshowList :: [JsonDecodeError] -> ShowS
showList :: [JsonDecodeError] -> ShowS
Show)