diff --git a/src/PostgREST/Config.hs b/src/PostgREST/Config.hs index 9bb40aff1c..e99ffddf6a 100644 --- a/src/PostgREST/Config.hs +++ b/src/PostgREST/Config.hs @@ -50,7 +50,7 @@ import System.Environment (getEnvironment) import System.Posix.Types (FileMode) import PostgREST.Config.JSPath (JSPath, JSPathExp (..), - pRoleClaimKey) + dumpJSPath, pRoleClaimKey) import PostgREST.Config.Proxy (Proxy (..), isMalformedProxyUri, toURI) import PostgREST.DbStructure.Identifiers (QualifiedIdentifier, dumpQi, @@ -100,10 +100,10 @@ data LogLevel = LogCrit | LogError | LogWarn | LogInfo dumpLogLevel :: LogLevel -> Text dumpLogLevel = \case - LogCrit -> "crit" + LogCrit -> "crit" LogError -> "error" - LogWarn -> "warn" - LogInfo -> "info" + LogWarn -> "warn" + LogInfo -> "info" data OpenAPIMode = OAFollowPriv | OAIgnorePriv | OADisabled deriving Eq @@ -138,7 +138,7 @@ toText conf = ,("db-embed-default-join", q . dumpJoin . configDbEmbedDefaultJoin) ,("db-use-legacy-gucs", T.toLower . show . configDbUseLegacyGucs) ,("jwt-aud", toS . encode . maybe "" toJSON . configJwtAudience) - ,("jwt-role-claim-key", q . T.intercalate mempty . fmap show . configJwtRoleClaimKey) + ,("jwt-role-claim-key", q . T.intercalate mempty . fmap dumpJSPath . configJwtRoleClaimKey) ,("jwt-secret", q . toS . showJwtSecret) ,("jwt-secret-is-base64", T.toLower . show . configJwtSecretIsBase64) ,("log-level", q . dumpLogLevel . configLogLevel) diff --git a/src/PostgREST/Config/JSPath.hs b/src/PostgREST/Config/JSPath.hs index f5e9c8b2fd..3fbddae7f6 100644 --- a/src/PostgREST/Config/JSPath.hs +++ b/src/PostgREST/Config/JSPath.hs @@ -1,12 +1,7 @@ -{-| -Module : PostgREST.Types -Description : PostgREST common types and functions used by the rest of the modules --} -{-# LANGUAGE DuplicateRecordFields #-} - module PostgREST.Config.JSPath ( JSPath , JSPathExp(..) + , dumpJSPath , pRoleClaimKey ) where @@ -16,8 +11,6 @@ import Data.Either.Combinators (mapLeft) import Text.ParserCombinators.Parsec (()) import Text.Read (read) -import qualified GHC.Show (show) - import Protolude hiding (toS) import Protolude.Conv (toS) @@ -30,10 +23,10 @@ data JSPathExp = JSPKey Text | JSPIdx Int -instance Show JSPathExp where - -- TODO: this needs to be quoted properly for special chars - show (JSPKey k) = "." <> show k - show (JSPIdx i) = "[" <> show i <> "]" +dumpJSPath :: JSPathExp -> Text +-- TODO: this needs to be quoted properly for special chars +dumpJSPath (JSPKey k) = "." <> show k +dumpJSPath (JSPIdx i) = "[" <> show i <> "]" -- Used for the config value "role-claim-key" pRoleClaimKey :: Text -> Either Text JSPath