Skip to content

Commit

Permalink
postgrest-style run updates
Browse files Browse the repository at this point in the history
  • Loading branch information
Michal Kleczek committed Feb 5, 2025
1 parent c504f84 commit e17aea6
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 3 deletions.
2 changes: 1 addition & 1 deletion src/PostgREST/AppState.hs
Original file line number Diff line number Diff line change
Expand Up @@ -85,7 +85,7 @@ data AuthResult = AuthResult
}

data JwtCacheState = JwtCacheState
{ cache :: C.Cache ByteString AuthResult
{ cache :: C.Cache ByteString AuthResult
, purgeLock :: MVar ()}

data AppState = AppState
Expand Down
5 changes: 3 additions & 2 deletions src/PostgREST/Auth.hs
Original file line number Diff line number Diff line change
Expand Up @@ -10,8 +10,8 @@ Authentication should always be implemented in an external service.
In the test suite there is an example of simple login function that can be used for a
very simple authentication system inside the PostgreSQL database.
-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE LambdaCase #-}
module PostgREST.Auth
( AuthResult (..)
, getResult
Expand Down Expand Up @@ -46,7 +46,8 @@ import System.Clock (TimeSpec (..))
import System.IO.Unsafe (unsafePerformIO)
import System.TimeIt (timeItT)

import PostgREST.AppState (AppState, AuthResult (..), JwtCacheState(..), getConfig,
import PostgREST.AppState (AppState, AuthResult (..),
JwtCacheState (..), getConfig,
getJwtCacheState, getTime)
import PostgREST.Config (AppConfig (..), FilterExp (..), JSPath,
JSPathExp (..))
Expand Down

0 comments on commit e17aea6

Please sign in to comment.