Skip to content

Commit

Permalink
test: rename module NoJwtSpec.hs -> NoJwtSecretSpec.hs
Browse files Browse the repository at this point in the history
  • Loading branch information
taimoorzaeem authored and steve-chavez committed Mar 6, 2025
1 parent 4348cb2 commit 53ca035
Show file tree
Hide file tree
Showing 4 changed files with 8 additions and 8 deletions.
2 changes: 1 addition & 1 deletion postgrest.cabal
Original file line number Diff line number Diff line change
Expand Up @@ -208,7 +208,7 @@ test-suite spec
Feature.Auth.AuthSpec
Feature.Auth.BinaryJwtSecretSpec
Feature.Auth.NoAnonSpec
Feature.Auth.NoJwtSpec
Feature.Auth.NoJwtSecretSpec
Feature.ConcurrentSpec
Feature.CorsSpec
Feature.ExtraSearchPathSpec
Expand Down
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
module Feature.Auth.NoJwtSpec where
module Feature.Auth.NoJwtSecretSpec where

import Network.Wai (Application)

Expand Down
8 changes: 4 additions & 4 deletions test/spec/Main.hs
Original file line number Diff line number Diff line change
Expand Up @@ -25,7 +25,7 @@ import qualified Feature.Auth.AudienceJwtSecretSpec
import qualified Feature.Auth.AuthSpec
import qualified Feature.Auth.BinaryJwtSecretSpec
import qualified Feature.Auth.NoAnonSpec
import qualified Feature.Auth.NoJwtSpec
import qualified Feature.Auth.NoJwtSecretSpec
import qualified Feature.ConcurrentSpec
import qualified Feature.CorsSpec
import qualified Feature.ExtraSearchPathSpec
Expand Down Expand Up @@ -110,7 +110,7 @@ main = do
securityOpenApi = app testSecurityOpenApiCfg
proxyApp = app testProxyCfg
noAnonApp = app testCfgNoAnon
noJwtApp = app testCfgNoJWT
noJwtSecretApp = app testCfgNoJwtSecret
binaryJwtApp = app testCfgBinaryJWT
audJwtApp = app testCfgAudienceJWT
asymJwkApp = app testCfgAsymJWK
Expand Down Expand Up @@ -202,8 +202,8 @@ main = do
describe "Feature.Auth.NoAnonSpec" Feature.Auth.NoAnonSpec.spec

-- this test runs without a JWT secret
parallel $ before noJwtApp $
describe "Feature.Auth.NoJwtSpec" Feature.Auth.NoJwtSpec.spec
parallel $ before noJwtSecretApp $
describe "Feature.Auth.NoJwtSecretSpec" Feature.Auth.NoJwtSecretSpec.spec

-- this test runs with a binary JWT secret
parallel $ before binaryJwtApp $
Expand Down
4 changes: 2 additions & 2 deletions test/spec/SpecHelper.hs
Original file line number Diff line number Diff line change
Expand Up @@ -171,8 +171,8 @@ testCfgForceRollback = baseCfg { configDbTxAllowOverride = False, configDbTxRoll
testCfgNoAnon :: AppConfig
testCfgNoAnon = baseCfg { configDbAnonRole = Nothing }

testCfgNoJWT :: AppConfig
testCfgNoJWT = baseCfg { configJwtSecret = Nothing, configJWKS = Nothing }
testCfgNoJwtSecret :: AppConfig
testCfgNoJwtSecret = baseCfg { configJwtSecret = Nothing, configJWKS = Nothing }

testUnicodeCfg :: AppConfig
testUnicodeCfg = baseCfg { configDbSchemas = fromList ["تست"] }
Expand Down

0 comments on commit 53ca035

Please sign in to comment.