2 Module : Gargantext.API.Prelude
3 Description : Server API main Types
4 Copyright : (c) CNRS, 2017-Present
5 License : AGPL + CECILL v3
6 Maintainer : team@gargantext.org
7 Stability : experimental
12 {-# LANGUAGE ConstraintKinds #-}
13 {-# LANGUAGE FunctionalDependencies #-}
14 {-# LANGUAGE TemplateHaskell #-}
15 {-# LANGUAGE TypeOperators #-}
16 {-# LANGUAGE UndecidableInstances #-}
18 module Gargantext.API.Prelude
19 ( module Gargantext.API.Prelude
25 import Control.Concurrent (threadDelay)
26 import Control.Exception (Exception)
27 import Control.Lens (Prism', (#))
28 import Control.Lens.TH (makePrisms)
29 import Control.Monad.Error.Class (MonadError(throwError))
30 import Control.Monad.Except (ExceptT)
31 import Control.Monad.Reader (ReaderT)
32 import Crypto.JOSE.Error as Jose
33 import Data.Aeson.Types
37 import Servant.Job.Async
38 import Servant.Job.Core (HasServerError(..), serverError)
40 import Gargantext.API.Admin.Orchestrator.Types
41 import Gargantext.API.Admin.Settings
42 import Gargantext.API.Ngrams
43 import Gargantext.Core.Types
44 import Gargantext.Database.Prelude
45 import Gargantext.Database.Query.Table.Node.Error (NodeError(..), HasNodeError(..))
46 import Gargantext.Database.Query.Tree
47 import Gargantext.Prelude
49 class HasJoseError e where
50 _JoseError :: Prism' e Jose.Error
52 joseError :: (MonadError e m, HasJoseError e) => Jose.Error -> m a
53 joseError = throwError . (_JoseError #)
55 class ThrowAll' e a | a -> e where
56 -- | 'throwAll' is a convenience function to throw errors across an entire
60 -- > throwAll err400 :: Handler a :<|> Handler b :<|> Handler c
61 -- > == throwError err400 :<|> throwError err400 :<|> err400
64 instance (ThrowAll' e a, ThrowAll' e b) => ThrowAll' e (a :<|> b) where
65 throwAll' e = throwAll' e :<|> throwAll' e
67 -- Really this shouldn't be necessary - ((->) a) should be an instance of
69 instance {-# OVERLAPPING #-} ThrowAll' e b => ThrowAll' e (a -> b) where
70 throwAll' e = const $ throwAll' e
72 instance {-# OVERLAPPABLE #-} (MonadError e m) => ThrowAll' e (m a) where
73 throwAll' = throwError
75 type GargServerC env err m =
82 , ToJSON err -- TODO this is arguable
86 , HasJobEnv env JobLog JobLog
90 type GargServerT env err m api = GargServerC env err m => ServerT api m
93 forall env err m. GargServerT env err m api
95 -- This is the concrete monad. It needs to be used as little as possible,
96 -- instead, prefer GargServer, GargServerT, GargServerC.
97 type GargServerM env err = ReaderT env (ExceptT err IO)
100 ( HasConnectionPool env
103 , HasJobEnv env JobLog JobLog
107 -------------------------------------------------------------------
108 runCmdReplEasy :: Cmd' DevEnv GargError a -> IO a
109 runCmdReplEasy f = withDevEnv "gargantext.ini" $ \env -> runCmdDev env f
111 -------------------------------------------------------------------
112 -- | This Type is needed to prepare the function before the GargServer
113 type GargNoServer' env err m =
120 type GargNoServer t =
121 forall env err m. GargNoServer' env err m => m t
122 -------------------------------------------------------------------
125 = GargNodeError NodeError
126 | GargTreeError TreeError
127 | GargInvalidError Validation
128 | GargJoseError Jose.Error
129 | GargServerError ServerError
130 deriving (Show, Typeable)
132 makePrisms ''GargError
134 instance ToJSON GargError where
135 toJSON _ = String "SomeGargErrorPleaseReport"
137 instance Exception GargError
139 instance HasNodeError GargError where
140 _NodeError = _GargNodeError
142 instance HasInvalidError GargError where
143 _InvalidError = _GargInvalidError
145 instance HasTreeError GargError where
146 _TreeError = _GargTreeError
148 instance HasServerError GargError where
149 _ServerError = _GargServerError
151 instance HasJoseError GargError where
152 _JoseError = _GargJoseError
155 ------------------------------------------------------------------------
158 simuLogs :: MonadBase IO m
162 simuLogs logStatus t = do
163 _ <- mapM (\n -> simuTask logStatus n t) $ take t [0,1..]
164 pure $ JobLog { _scst_succeeded = Just t
165 , _scst_failed = Just 0
166 , _scst_remaining = Just 0
167 , _scst_events = Just []
170 simuTask :: MonadBase IO m
175 simuTask logStatus cur total = do
176 let m = (10 :: Int) ^ (6 :: Int)
177 liftBase $ threadDelay (m*5)
179 let status = JobLog { _scst_succeeded = Just cur
180 , _scst_failed = Just 0
181 , _scst_remaining = (-) <$> Just total <*> Just cur
182 , _scst_events = Just []
184 printDebug "status" status