{-|
Module: IHP.Controller.Context
Copyright: (c) digitally induced GmbH, 2020
-}
module IHP.Controller.Context where

import IHP.Prelude
import qualified Data.TMap as TypeMap
import qualified Data.Typeable as Typeable
import IHP.Controller.RequestContext
import IHP.FrameworkConfig
import IHP.Log.Types

-- | A container storing useful data along the request lifecycle, such as the request, the current user, set current view layout, flash messages, ...
--
-- The controller context is usually accessed via the @?context@ variable. It's availble inside the action and the view. Think of it as a key-value-map where the key is the type of the value.
--
-- You can store information inside the context using 'putContext':
--
-- >>> newtype CurrentLayout = CurrentLayout Html
-- >>>
-- >>> ?context <- newControllerContext
-- >>> putContext (CurrentLayout layout)
--
-- Inside an action you can access the values using 'fromContext':
--
-- >>> (CurrentLayout layout) <- fromContext
--
-- You can freeze the context and then access values without being inside an IO context (like inside views which are pure):
--
-- Call 'freeze' inside an IO part:
--
-- >>> ?context <- freeze ?context
--
-- ('freeze' is automatically called by IHP before rendering a view, so usually you don't need to call it manually)
--
-- Then use the frozen context from your pure code like this:
--
-- >>> let (CurrentLayout layout) = fromFrozenContext in ...
--
-- The context is initially created before a action is going to be executed. Its life cycle looks like this:
--
-- - @newControllerContext@: The new controller context is created
-- - The 'IHP.ControllerSupport.runActionWithNewContext' fills in a few default values: The current @?application@ and also the Flash Messages to be rendered in the to-be-generated response.
-- - @initContext@: The initContext function of the @InitControllerContext WebApplication@ (inside your FrontController.hs) is called. There application-specific context can be provided. Usually this is the current user and the default layout.
-- - @beforeAction@: Here the context could also be modified. E.g. the layout could be overriden here for the whole controller.
-- - @action ..@: The action itself.
-- - Freezing: Before rendering the response, the container is frozen. Frozen means that all previously mutable fields become immutable.
-- - View Rendering: The frozen container is now used inside the view and layout to display information such as the current user or flash messages
data ControllerContext = ControllerContext { ControllerContext -> RequestContext
requestContext :: RequestContext, ControllerContext -> IORef TMap
customFieldsRef :: IORef TypeMap.TMap }
                       | FrozenControllerContext { requestContext :: RequestContext, ControllerContext -> TMap
customFields :: TypeMap.TMap }

newControllerContext :: (?requestContext :: RequestContext) => IO ControllerContext
newControllerContext :: (?requestContext::RequestContext) => IO ControllerContext
newControllerContext = do
    IORef TMap
customFieldsRef <- TMap -> IO (IORef TMap)
forall a. a -> IO (IORef a)
newIORef TMap
TypeMap.empty
    ControllerContext -> IO ControllerContext
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ControllerContext { $sel:requestContext:ControllerContext :: RequestContext
requestContext = ?requestContext::RequestContext
RequestContext
?requestContext, IORef TMap
$sel:customFieldsRef:ControllerContext :: IORef TMap
customFieldsRef :: IORef TMap
customFieldsRef }
{-# INLINABLE newControllerContext #-}

-- | After freezing a container you can access its values from pure non-IO code by using 'fromFronzenContext'
--
-- Calls to 'putContext' will throw an exception after it's frozen.
freeze :: ControllerContext -> IO ControllerContext
freeze :: ControllerContext -> IO ControllerContext
freeze ControllerContext { RequestContext
$sel:requestContext:ControllerContext :: ControllerContext -> RequestContext
requestContext :: RequestContext
requestContext, IORef TMap
$sel:customFieldsRef:ControllerContext :: ControllerContext -> IORef TMap
customFieldsRef :: IORef TMap
customFieldsRef } = RequestContext -> TMap -> ControllerContext
FrozenControllerContext RequestContext
requestContext (TMap -> ControllerContext) -> IO TMap -> IO ControllerContext
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> IORef TMap -> IO TMap
forall a. IORef a -> IO a
readIORef IORef TMap
customFieldsRef
freeze ControllerContext
frozen = ControllerContext -> IO ControllerContext
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ControllerContext
frozen
{-# INLINABLE freeze #-}

-- | Returns a unfrozen version of the controller context that can be modified again
--
-- This is used together with 'freeze' by e.g. AutoRefresh to make a immutable copy of the current controller context state
unfreeze :: ControllerContext -> IO ControllerContext
unfreeze :: ControllerContext -> IO ControllerContext
unfreeze FrozenControllerContext { RequestContext
$sel:requestContext:ControllerContext :: ControllerContext -> RequestContext
requestContext :: RequestContext
requestContext, TMap
$sel:customFields:ControllerContext :: ControllerContext -> TMap
customFields :: TMap
customFields } = do
    IORef TMap
customFieldsRef <- TMap -> IO (IORef TMap)
forall a. a -> IO (IORef a)
newIORef TMap
customFields
    ControllerContext -> IO ControllerContext
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ControllerContext { IORef TMap
RequestContext
$sel:requestContext:ControllerContext :: RequestContext
$sel:customFieldsRef:ControllerContext :: IORef TMap
requestContext :: RequestContext
customFieldsRef :: IORef TMap
.. }
unfreeze ControllerContext {} = Text -> IO ControllerContext
forall a. Text -> a
error Text
"Cannot call unfreeze on a controller context that is not frozen"
{-# INLINABLE unfreeze #-}


-- | Returns a value from the current controller context
--
-- Throws an exception if the there is no value with the type inside the context
--
-- __Example:__ Read the current user from the context
--
-- >>> user <- fromContext @User
fromContext :: forall value. (?context :: ControllerContext, Typeable value) => IO value
fromContext :: forall value.
(?context::ControllerContext, Typeable value) =>
IO value
fromContext = forall value.
(?context::ControllerContext, Typeable value) =>
IO (Maybe value)
maybeFromContext @value IO (Maybe value) -> (Maybe value -> IO value) -> IO value
forall a b. IO a -> (a -> IO b) -> IO b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= \case
        Just value
value -> value -> IO value
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure value
value
        Maybe value
Nothing -> do
            let ControllerContext { IORef TMap
$sel:customFieldsRef:ControllerContext :: ControllerContext -> IORef TMap
customFieldsRef :: IORef TMap
customFieldsRef } = ?context::ControllerContext
ControllerContext
?context
            TMap
customFields <- IORef TMap -> IO TMap
forall a. IORef a -> IO a
readIORef IORef TMap
customFieldsRef
            let notFoundMessage :: Text
notFoundMessage = (Text
"Unable to find " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> (TypeRep -> Text
forall a. Show a => a -> Text
show (Proxy value -> TypeRep
forall {k} (proxy :: k -> *) (a :: k).
Typeable a =>
proxy a -> TypeRep
Typeable.typeRep (forall t. Proxy t
forall {k} (t :: k). Proxy t
Typeable.Proxy @value))) Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
" in controller context: " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> TMap -> Text
forall a. Show a => a -> Text
show TMap
customFields)

            Text -> IO value
forall a. Text -> a
error Text
notFoundMessage
{-# INLINABLE fromContext #-}

-- | Returns a value from the current controller context. Requires the context to be frozen.
--
-- __Example:__ Read the current user from the context
--
-- >>> let user = fromFrozenContext @User
fromFrozenContext :: forall value. (?context :: ControllerContext, Typeable value) => value
fromFrozenContext :: forall value.
(?context::ControllerContext, Typeable value) =>
value
fromFrozenContext = case forall value.
(?context::ControllerContext, Typeable value) =>
Maybe value
maybeFromFrozenContext @value of
        Just value
value -> value
value
        Maybe value
Nothing -> do
            let FrozenControllerContext { TMap
$sel:customFields:ControllerContext :: ControllerContext -> TMap
customFields :: TMap
customFields } = ?context::ControllerContext
ControllerContext
?context
            let notFoundMessage :: Text
notFoundMessage = (Text
"Unable to find " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> (TypeRep -> Text
forall a. Show a => a -> Text
show (Proxy value -> TypeRep
forall {k} (proxy :: k -> *) (a :: k).
Typeable a =>
proxy a -> TypeRep
Typeable.typeRep (forall t. Proxy t
forall {k} (t :: k). Proxy t
Typeable.Proxy @value))) Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
" in controller context: " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> TMap -> Text
forall a. Show a => a -> Text
show TMap
customFields)

            Text -> value
forall a. Text -> a
error Text
notFoundMessage
{-# INLINABLE fromFrozenContext #-}

maybeFromContext :: forall value. (?context :: ControllerContext, Typeable value) => IO (Maybe value)
maybeFromContext :: forall value.
(?context::ControllerContext, Typeable value) =>
IO (Maybe value)
maybeFromContext = do
    ControllerContext
frozen <- ControllerContext -> IO ControllerContext
freeze ?context::ControllerContext
ControllerContext
?context
    let ?context = ?context::ControllerContext
ControllerContext
frozen
    Maybe value -> IO (Maybe value)
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (forall value.
(?context::ControllerContext, Typeable value) =>
Maybe value
maybeFromFrozenContext @value)
{-# INLINABLE maybeFromContext #-}

maybeFromFrozenContext :: forall value. (?context :: ControllerContext, Typeable value) => Maybe value
maybeFromFrozenContext :: forall value.
(?context::ControllerContext, Typeable value) =>
Maybe value
maybeFromFrozenContext = case ?context::ControllerContext
ControllerContext
?context of
        FrozenControllerContext { TMap
$sel:customFields:ControllerContext :: ControllerContext -> TMap
customFields :: TMap
customFields } -> forall a. Typeable a => TMap -> Maybe a
TypeMap.lookup @value TMap
customFields
        ControllerContext {} -> Text -> Maybe value
forall a. Text -> a
error (Text
"maybeFromFrozenContext called on a non frozen context while trying to access " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> (TypeRep -> Text
forall a. Show a => a -> Text
show (Proxy value -> TypeRep
forall {k} (proxy :: k -> *) (a :: k).
Typeable a =>
proxy a -> TypeRep
Typeable.typeRep (forall t. Proxy t
forall {k} (t :: k). Proxy t
Typeable.Proxy @value))))
{-# INLINABLE maybeFromFrozenContext #-}

-- | Puts a value into the context
--
-- Throws an exception if the context is already frozen.
putContext :: forall value. (?context :: ControllerContext, Typeable value) => value -> IO ()
putContext :: forall value.
(?context::ControllerContext, Typeable value) =>
value -> IO ()
putContext value
value = do
    let ControllerContext { IORef TMap
$sel:customFieldsRef:ControllerContext :: ControllerContext -> IORef TMap
customFieldsRef :: IORef TMap
customFieldsRef } = ?context::ControllerContext
ControllerContext
?context
    IORef TMap -> (TMap -> TMap) -> IO ()
forall a. IORef a -> (a -> a) -> IO ()
modifyIORef IORef TMap
customFieldsRef (value -> TMap -> TMap
forall a. Typeable a => a -> TMap -> TMap
TypeMap.insert value
value)
    () -> IO ()
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
{-# INLINABLE putContext #-}

newtype ActionType = ActionType Typeable.TypeRep

instance HasField "frameworkConfig" ControllerContext FrameworkConfig where
    getField :: ControllerContext -> FrameworkConfig
getField ControllerContext
controllerContext = ControllerContext
controllerContext.requestContext.frameworkConfig
    {-# INLINABLE getField #-}

instance HasField "logger" ControllerContext Logger where
    getField :: ControllerContext -> Logger
getField ControllerContext
controllerContext = ControllerContext
controllerContext.frameworkConfig.logger