Skip to content

Commit

Permalink
refactor: Remove GHC.Show instances from JSPath module
Browse files Browse the repository at this point in the history
  • Loading branch information
monacoremo committed Nov 8, 2021
1 parent 5fdb5c4 commit c1e0dc7
Show file tree
Hide file tree
Showing 2 changed files with 10 additions and 17 deletions.
10 changes: 5 additions & 5 deletions src/PostgREST/Config.hs
Original file line number Diff line number Diff line change
Expand Up @@ -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,
Expand Down Expand Up @@ -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
Expand Down Expand Up @@ -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)
Expand Down
17 changes: 5 additions & 12 deletions src/PostgREST/Config/JSPath.hs
Original file line number Diff line number Diff line change
@@ -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

Expand All @@ -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)

Expand All @@ -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
Expand Down

0 comments on commit c1e0dc7

Please sign in to comment.