Commit 9e1c9fbb authored by Alexandre Delanoë's avatar Alexandre Delanoë

[MERGE] Orchestrator merge.

parents 697d44ea 2c0adcb4
...@@ -44,6 +44,10 @@ sudo apt-get install libbz2-dev lipq-dev ...@@ -44,6 +44,10 @@ sudo apt-get install libbz2-dev lipq-dev
- https://docs.haskellstack.org/en/stable/README/ - https://docs.haskellstack.org/en/stable/README/
- curl -sSL https://get.haskellstack.org/ | sh - curl -sSL https://get.haskellstack.org/ | sh
### Get the orchestrator library
git clone https://github.com/np/servant-job.git
## Building and installing ## Building and installing
stack install stack install
......
...@@ -58,6 +58,8 @@ library: ...@@ -58,6 +58,8 @@ library:
- fclabels - fclabels
- fast-logger - fast-logger
# - haskell-gi-base # - haskell-gi-base
- http-client
- http-client-tls
- http-conduit - http-conduit
- http-api-data - http-api-data
- http-types - http-types
...@@ -87,6 +89,7 @@ library: ...@@ -87,6 +89,7 @@ library:
- servant - servant
- servant-auth - servant-auth
- servant-client - servant-client
- servant-job
- servant-mock - servant-mock
- servant-multipart - servant-multipart
- servant-server - servant-server
......
...@@ -38,7 +38,7 @@ module Gargantext.API ...@@ -38,7 +38,7 @@ module Gargantext.API
--------------------------------------------------------------------- ---------------------------------------------------------------------
import Gargantext.Prelude import Gargantext.Prelude
import System.IO (FilePath, print) import System.IO (FilePath)
import GHC.Generics (D1, Meta (..), Rep) import GHC.Generics (D1, Meta (..), Rep)
import GHC.TypeLits (AppendSymbol, Symbol) import GHC.TypeLits (AppendSymbol, Symbol)
...@@ -47,16 +47,16 @@ import Control.Lens ...@@ -47,16 +47,16 @@ import Control.Lens
import Data.Aeson.Encode.Pretty (encodePretty) import Data.Aeson.Encode.Pretty (encodePretty)
import qualified Data.ByteString.Lazy.Char8 as BL8 import qualified Data.ByteString.Lazy.Char8 as BL8
import Data.Swagger import Data.Swagger
import Data.Text (Text, pack) import Data.Text (Text)
import qualified Data.Text.IO as T
--import qualified Data.Set as Set --import qualified Data.Set as Set
import Database.PostgreSQL.Simple (Connection, connect)
import Network.Wai import Network.Wai
import Network.Wai.Handler.Warp import Network.Wai.Handler.Warp hiding (defaultSettings)
import Servant import Servant
import Servant.Mock (mock) import Servant.Mock (mock)
import Servant.Job.Server (WithCallbacks)
import Servant.Swagger import Servant.Swagger
import Servant.Swagger.UI import Servant.Swagger.UI
-- import Servant.API.Stream -- import Servant.API.Stream
...@@ -69,7 +69,8 @@ import Gargantext.API.Node ( Roots , roots ...@@ -69,7 +69,8 @@ import Gargantext.API.Node ( Roots , roots
, NodesAPI , nodesAPI , NodesAPI , nodesAPI
) )
import Gargantext.API.Count ( CountAPI, count, Query) import Gargantext.API.Count ( CountAPI, count, Query)
import Gargantext.Database.Utils (databaseParameters) import Gargantext.API.Orchestrator
import Gargantext.API.Orchestrator.Types
--------------------------------------------------------------------- ---------------------------------------------------------------------
...@@ -90,9 +91,7 @@ import Network.Wai.Middleware.RequestLogger ...@@ -90,9 +91,7 @@ import Network.Wai.Middleware.RequestLogger
import Network.HTTP.Types hiding (Query) import Network.HTTP.Types hiding (Query)
-- import Gargantext.API.Settings import Gargantext.API.Settings
data FireWall = FireWall { unFireWall :: Bool }
fireWall :: Applicative f => Request -> FireWall -> f Bool fireWall :: Applicative f => Request -> FireWall -> f Bool
fireWall req fw = do fireWall req fw = do
...@@ -110,15 +109,15 @@ fireWall req fw = do ...@@ -110,15 +109,15 @@ fireWall req fw = do
else pure False else pure False
-- makeApp :: Env -> IO (Warp.Settings, Application) -- makeMockApp :: Env -> IO (Warp.Settings, Application)
makeApp :: FireWall -> IO Application makeMockApp :: MockEnv -> IO Application
makeApp fw = do makeMockApp env = do
let serverApp = appMock let serverApp = appMock
-- logWare <- mkRequestLogger def { destination = RequestLogger.Logger $ env^.logger } -- logWare <- mkRequestLogger def { destination = RequestLogger.Logger $ env^.logger }
--logWare <- mkRequestLogger def { destination = RequestLogger.Logger "/tmp/logs.txt" } --logWare <- mkRequestLogger def { destination = RequestLogger.Logger "/tmp/logs.txt" }
let checkOriginAndHost app req resp = do let checkOriginAndHost app req resp = do
blocking <- fireWall req fw blocking <- fireWall req (env ^. menv_firewall)
case blocking of case blocking of
True -> app req resp True -> app req resp
False -> resp ( responseLBS status401 [] False -> resp ( responseLBS status401 []
...@@ -144,8 +143,6 @@ makeApp fw = do ...@@ -144,8 +143,6 @@ makeApp fw = do
pure $ logStdoutDev $ checkOriginAndHost $ corsMiddleware $ serverApp pure $ logStdoutDev $ checkOriginAndHost $ corsMiddleware $ serverApp
---------------------------------------------------------------------
type PortNumber = Int
--------------------------------------------------------------------- ---------------------------------------------------------------------
-- | API Global -- | API Global
...@@ -169,6 +166,8 @@ type GargAPI = "user" :> Summary "First user endpoint" ...@@ -169,6 +166,8 @@ type GargAPI = "user" :> Summary "First user endpoint"
:<|> "count" :> Summary "Count endpoint" :<|> "count" :> Summary "Count endpoint"
:> ReqBody '[JSON] Query :> CountAPI :> ReqBody '[JSON] Query :> CountAPI
:<|> "scraper" :> WithCallbacks ScraperAPI
-- /mv/<id>/<id> -- /mv/<id>/<id>
-- /merge/<id>/<id> -- /merge/<id>/<id>
-- /rename/<id> -- /rename/<id>
...@@ -183,13 +182,18 @@ type API = SwaggerFrontAPI :<|> GargAPI ...@@ -183,13 +182,18 @@ type API = SwaggerFrontAPI :<|> GargAPI
--------------------------------------------------------------------- ---------------------------------------------------------------------
-- | Server declaration -- | Server declaration
server :: Connection -> Server API server :: Env -> IO (Server API)
server conn = swaggerFront server env = do
orchestrator <- scrapyOrchestrator env
pure $ swaggerFront
:<|> roots conn :<|> roots conn
:<|> nodeAPI conn :<|> nodeAPI conn
:<|> nodeAPI conn :<|> nodeAPI conn
:<|> nodesAPI conn :<|> nodesAPI conn
:<|> count :<|> count
:<|> orchestrator
where
conn = env ^. env_conn
--------------------------------------------------------------------- ---------------------------------------------------------------------
swaggerFront :: Server SwaggerFrontAPI swaggerFront :: Server SwaggerFrontAPI
...@@ -200,8 +204,8 @@ gargMock :: Server GargAPI ...@@ -200,8 +204,8 @@ gargMock :: Server GargAPI
gargMock = mock apiGarg Proxy gargMock = mock apiGarg Proxy
--------------------------------------------------------------------- ---------------------------------------------------------------------
app :: Connection -> Application makeApp :: Env -> IO Application
app = serve api . server makeApp = fmap (serve api) . server
appMock :: Application appMock :: Application
appMock = serve api (swaggerFront :<|> gargMock) appMock = serve api (swaggerFront :<|> gargMock)
...@@ -219,7 +223,7 @@ schemaUiServer :: (Server api ~ Handler Swagger) ...@@ -219,7 +223,7 @@ schemaUiServer :: (Server api ~ Handler Swagger)
schemaUiServer = swaggerSchemaUIServer schemaUiServer = swaggerSchemaUIServer
-- Type Familiy for the Documentation -- Type Family for the Documentation
type family TypeName (x :: *) :: Symbol where type family TypeName (x :: *) :: Symbol where
TypeName Int = "Int" TypeName Int = "Int"
TypeName Text = "Text" TypeName Text = "Text"
...@@ -251,25 +255,23 @@ swaggerWriteJSON = BL8.writeFile "swagger.json" (encodePretty swaggerDoc) ...@@ -251,25 +255,23 @@ swaggerWriteJSON = BL8.writeFile "swagger.json" (encodePretty swaggerDoc)
portRouteInfo :: PortNumber -> IO () portRouteInfo :: PortNumber -> IO ()
portRouteInfo port = do portRouteInfo port = do
print (pack " ----Main Routes----- ") T.putStrLn " ----Main Routes----- "
print ("http://localhost:" <> show port <> "/index.html") T.putStrLn $ "http://localhost:" <> toUrlPiece port <> "/index.html"
print ("http://localhost:" <> show port <> "/swagger-ui") T.putStrLn $ "http://localhost:" <> toUrlPiece port <> "/swagger-ui"
-- | startGargantext takes as parameters port number and Ini file. -- | startGargantext takes as parameters port number and Ini file.
startGargantext :: PortNumber -> FilePath -> IO () startGargantext :: PortNumber -> FilePath -> IO ()
startGargantext port file = do startGargantext port file = do
env <- newEnv port file
param <- databaseParameters file
conn <- connect param
portRouteInfo port portRouteInfo port
run port (app conn) app <- makeApp env
run port app
startGargantextMock :: PortNumber -> IO () startGargantextMock :: PortNumber -> IO ()
startGargantextMock port = do startGargantextMock port = do
portRouteInfo port portRouteInfo port
application <- makeApp (FireWall False) application <- makeMockApp . MockEnv $ FireWall False
run port application run port application
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE TypeOperators #-}
module Gargantext.API.Orchestrator where
import Gargantext.Prelude
import Gargantext.API.Settings
import Gargantext.API.Orchestrator.Types
import Gargantext.API.Orchestrator.Scrapy.Schedule
import Control.Lens hiding (elements)
import Data.Aeson
import qualified Data.ByteString.Lazy.Char8 as LBS
import Servant
import Servant.Job.Async
import Servant.Job.Client
import Servant.Job.Server
import Servant.Job.Utils (extendBaseUrl)
callJobScrapy :: (ToJSON e, FromJSON e, FromJSON o, MonadClientJob m)
=> JobServerURL e Schedule o
-> (URL -> Schedule)
-> m o
callJobScrapy jurl schedule = do
progress $ NewTask jurl
out <- view job_output <$>
retryOnTransientFailure (clientCallbackJob' jurl
(fmap (const ()) . scrapySchedule . schedule))
progress $ Finished jurl Nothing
pure out
logConsole :: ToJSON a => a -> IO ()
logConsole = LBS.putStrLn . encode
callScraper :: MonadClientJob m => URL -> ScraperInput -> m ScraperStatus
callScraper url input =
callJobScrapy jurl $ \cb ->
Schedule
{ s_project = "gargantext"
, s_spider = input ^. scin_spider
, s_setting = []
, s_jobid = Nothing
, s_version = Nothing
, s_extra =
[("query", input ^.. scin_query . _Just)
,("user", [input ^. scin_user])
,("corpus", [input ^. scin_corpus . to toUrlPiece])
,("report_every", input ^.. scin_report_every . _Just . to toUrlPiece)
,("limit", input ^.. scin_limit . _Just . to toUrlPiece)
,("url", input ^.. scin_local_file . _Just)
,("count_only", input ^.. scin_count_only . _Just . to toUrlPiece)
,("callback", [toUrlPiece cb])]
}
where
jurl :: JobServerURL ScraperStatus Schedule ScraperStatus
jurl = JobServerURL url Callback
pipeline :: FromJSON e => URL -> ClientEnv -> ScraperInput
-> (e -> IO ()) -> IO ScraperStatus
pipeline scrapyurl client_env input log_status = do
e <- runJobMLog client_env log_status $ callScraper scrapyurl input
either (panic . cs . show) pure e
scrapyOrchestrator :: Env -> IO (Server (WithCallbacks ScraperAPI))
scrapyOrchestrator env = do
apiWithCallbacksServer (Proxy :: Proxy ScraperAPI)
defaultSettings (extendBaseUrl ("scraper" :: String) $ env ^. env_self_url)
(env ^. env_manager) (LogEvent logConsole) $
serveJobsAPI (env ^. env_scrapers) .
JobFunction . pipeline (URL $ env ^. env_settings . scrapydUrl)
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeOperators #-}
module Gargantext.API.Orchestrator.Scrapy.Schedule where
import Control.Lens
import Data.Aeson
import qualified Data.HashMap.Strict as H
import Data.Text (Text)
import GHC.Generics
import Servant
import Servant.Job.Utils (jsonOptions)
import Servant.Client
import Web.FormUrlEncoded hiding (parseMaybe)
data Schedule = Schedule
{ s_project :: !Text
, s_spider :: !Text
, s_setting :: ![Text]
, s_jobid :: !(Maybe Text)
, s_version :: !(Maybe Text)
, s_extra :: ![(Text,[Text])]
}
deriving (Generic)
data ScheduleResponse = ScheduleResponse
{ r_status :: !Text
, r_jobid :: !Text
}
deriving (Generic)
instance FromJSON ScheduleResponse where
parseJSON = genericParseJSON (jsonOptions "r_")
instance ToForm Schedule where
toForm s =
Form . H.fromList $
[("project", [s_project s])
,("spider", [s_spider s])
,("setting", s_setting s)
,("jobid", s_jobid s ^.. _Just)
,("_version", s_version s ^.. _Just)
] ++ s_extra s
type Scrapy =
"schedule.json" :> ReqBody '[FormUrlEncoded] Schedule
:> Post '[JSON] ScheduleResponse
scrapyAPI :: Proxy Scrapy
scrapyAPI = Proxy
scrapySchedule :: Schedule -> ClientM ScheduleResponse
scrapySchedule = client scrapyAPI
{-# OPTIONS_GHC -fno-warn-orphans #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE TypeOperators #-}
module Gargantext.API.Orchestrator.Types where
import Gargantext.Prelude
import Control.Lens hiding (elements)
import Data.Aeson
import Data.Text (Text)
import Data.Swagger hiding (URL, url, port)
import GHC.Generics hiding (to)
import Servant.Job.Async
import Servant.Job.Client
import Servant.Job.Types
import Servant.Job.Utils (jsonOptions)
import Test.QuickCheck (elements)
import Test.QuickCheck.Arbitrary
instance Arbitrary a => Arbitrary (JobStatus 'Safe a) where
arbitrary = panic "TODO"
instance Arbitrary a => Arbitrary (JobOutput a) where
arbitrary = JobOutput <$> arbitrary
instance ToSchema URL where
declareNamedSchema = panic "TODO"
instance ToSchema AnyOutput where
declareNamedSchema = panic "TODO"
instance ToSchema AnyInput where
declareNamedSchema = panic "TODO"
instance ToSchema AnyEvent where
declareNamedSchema = panic "TODO"
instance ToSchema a => ToSchema (JobInput a)
instance ToSchema a => ToSchema (JobOutput a)
data ScraperInput = ScraperInput
{ _scin_spider :: !Text
, _scin_query :: !(Maybe Text)
, _scin_user :: !Text
, _scin_corpus :: !Int
, _scin_report_every :: !(Maybe Int)
, _scin_limit :: !(Maybe Int)
, _scin_local_file :: !(Maybe Text)
, _scin_count_only :: !(Maybe Bool)
}
deriving Generic
makeLenses ''ScraperInput
instance FromJSON ScraperInput where
parseJSON = genericParseJSON $ jsonOptions "_scin_"
data ScraperEvent = ScraperEvent
{ _scev_message :: !(Maybe Text)
, _scev_level :: !(Maybe Text)
, _scev_date :: !(Maybe Text)
}
deriving Generic
instance Arbitrary ScraperEvent where
arbitrary = ScraperEvent <$> elements [Nothing, Just "test message"]
<*> elements [Nothing, Just "INFO", Just "WARN"]
<*> elements [Nothing, Just "2018-04-18"]
instance ToJSON ScraperEvent where
toJSON = genericToJSON $ jsonOptions "_scev_"
instance FromJSON ScraperEvent where
parseJSON = genericParseJSON $ jsonOptions "_scev_"
data ScraperStatus = ScraperStatus
{ _scst_succeeded :: !(Maybe Int)
, _scst_failed :: !(Maybe Int)
, _scst_remaining :: !(Maybe Int)
, _scst_events :: !(Maybe [ScraperEvent])
}
deriving Generic
instance Arbitrary ScraperStatus where
arbitrary = ScraperStatus <$> arbitrary <*> arbitrary <*> arbitrary <*> arbitrary
instance ToJSON ScraperStatus where
toJSON = genericToJSON $ jsonOptions "_scst_"
instance FromJSON ScraperStatus where
parseJSON = genericParseJSON $ jsonOptions "_scst_"
instance ToSchema ScraperStatus -- TODO _scst_ prefix
instance ToSchema ScraperInput -- TODO _scin_ prefix
instance ToSchema ScraperEvent -- TODO _scev_ prefix
instance ToParamSchema Offset where
toParamSchema = panic "TODO"
instance ToParamSchema Limit where
toParamSchema = panic "TODO"
type ScrapersEnv = JobEnv ScraperStatus ScraperStatus
type ScraperAPI = AsyncJobsAPI ScraperStatus ScraperInput ScraperStatus
...@@ -36,17 +36,20 @@ import GHC.Enum ...@@ -36,17 +36,20 @@ import GHC.Enum
import GHC.Generics (Generic) import GHC.Generics (Generic)
import Prelude (Bounded()) import Prelude (Bounded())
import System.Environment (lookupEnv) import System.Environment (lookupEnv)
import System.IO (FilePath)
-- import Control.Applicative ((<*>)) import Database.PostgreSQL.Simple (Connection, connect)
import Network.HTTP.Client (Manager)
import Network.HTTP.Client.TLS (newTlsManager)
import Data.Maybe (fromMaybe) import Data.Maybe (fromMaybe)
import Data.Either (either) import Data.Either (either)
-- import Data.Map
import Data.Text import Data.Text
import Data.Text.Encoding (encodeUtf8) import Data.Text.Encoding (encodeUtf8)
import Data.ByteString.Lazy.Internal import Data.ByteString.Lazy.Internal
import Servant import Servant
import Servant.Client (BaseUrl, parseBaseUrl)
import Servant.Job.Async (newJobEnv, defaultSettings)
import Web.HttpApiData (parseUrlPiece) import Web.HttpApiData (parseUrlPiece)
import qualified Jose.Jwk as Jose import qualified Jose.Jwk as Jose
import qualified Jose.Jwa as Jose import qualified Jose.Jwa as Jose
...@@ -54,7 +57,10 @@ import qualified Jose.Jwa as Jose ...@@ -54,7 +57,10 @@ import qualified Jose.Jwa as Jose
import Control.Monad.Logger import Control.Monad.Logger
import Control.Lens import Control.Lens
import Gargantext.Prelude import Gargantext.Prelude
import Gargantext.Database.Utils (databaseParameters)
import Gargantext.API.Orchestrator.Types
type PortNumber = Int
data SendEmailType = SendEmailViaAws data SendEmailType = SendEmailViaAws
| LogEmailToConsole | LogEmailToConsole
...@@ -65,11 +71,13 @@ data SendEmailType = SendEmailViaAws ...@@ -65,11 +71,13 @@ data SendEmailType = SendEmailViaAws
data Settings = Settings data Settings = Settings
{ _allowedOrigin :: ByteString -- ^ allowed origin for CORS { _allowedOrigin :: ByteString -- ^ allowed origin for CORS
, _allowedHost :: ByteString -- ^ allowed host for CORS , _allowedHost :: ByteString -- ^ allowed host for CORS
, _appPort :: Int , _appPort :: PortNumber
, _logLevelLimit :: LogLevel -- ^ log level from the monad-logger package , _logLevelLimit :: LogLevel -- ^ log level from the monad-logger package
, _dbServer :: Text -- , _dbServer :: Text
-- ^ this is not used yet
, _jwtSecret :: Jose.Jwk -- ^ key from the jose-jwt package , _jwtSecret :: Jose.Jwk -- ^ key from the jose-jwt package
, _sendLoginEmails :: SendEmailType , _sendLoginEmails :: SendEmailType
, _scrapydUrl :: BaseUrl
} }
makeLenses ''Settings makeLenses ''Settings
...@@ -90,12 +98,13 @@ devSettings = Settings ...@@ -90,12 +98,13 @@ devSettings = Settings
, _allowedHost = "localhost:3000" , _allowedHost = "localhost:3000"
, _appPort = 3000 , _appPort = 3000
, _logLevelLimit = LevelDebug , _logLevelLimit = LevelDebug
, _dbServer = "localhost" -- , _dbServer = "localhost"
-- generate with dd if=/dev/urandom bs=1 count=32 | base64 -- generate with dd if=/dev/urandom bs=1 count=32 | base64
-- make sure jwtSecret differs between development and production, because you do not want -- make sure jwtSecret differs between development and production, because you do not want
-- your production key inside source control. -- your production key inside source control.
, _jwtSecret = parseJwk "MVg0YAPVSPiYQc/qIs/rV/X32EFR0zOJWfHFgMbszMw=" , _jwtSecret = parseJwk "MVg0YAPVSPiYQc/qIs/rV/X32EFR0zOJWfHFgMbszMw="
, _sendLoginEmails = LogEmailToConsole , _sendLoginEmails = LogEmailToConsole
, _scrapydUrl = fromMaybe (panic "Invalid scrapy URL") $ parseBaseUrl "http://localhost:6800"
} }
...@@ -122,14 +131,43 @@ optSetting name d = do ...@@ -122,14 +131,43 @@ optSetting name d = do
-- <*> (parseJwk <$> reqSetting "JWT_SECRET") -- <*> (parseJwk <$> reqSetting "JWT_SECRET")
-- <*> optSetting "SEND_EMAIL" SendEmailViaAws -- <*> optSetting "SEND_EMAIL" SendEmailViaAws
data FireWall = FireWall { unFireWall :: Bool }
data Env = Env data Env = Env
{ _settings :: Settings { _env_settings :: !Settings
, _logger :: LoggerSet , _env_logger :: !LoggerSet
-- , _dbConfig :: ConnectionPool -- from Database.Persist.Postgresql , _env_conn :: !Connection
, _env_manager :: !Manager
, _env_self_url :: !BaseUrl
, _env_scrapers :: !ScrapersEnv
} }
deriving (Generic)
makeLenses ''Env makeLenses ''Env
createEnv :: Settings -> IO Env
createEnv _ = undefined {- implementation here: connect to db, init logger, etc -} data MockEnv = MockEnv
{ _menv_firewall :: !FireWall
}
deriving (Generic)
makeLenses ''MockEnv
newEnv :: PortNumber -> FilePath -> IO Env
newEnv port file = do
manager <- newTlsManager
settings <- pure (devSettings & appPort .~ port) -- TODO read from 'file'
when (port /= settings ^. appPort) $
panic "TODO: conflicting settings of port"
self_url <- parseBaseUrl $ "http://0.0.0.0:" <> show port
param <- databaseParameters file
conn <- connect param
scrapers_env <- newJobEnv defaultSettings manager
logger <- newStderrLoggerSet defaultBufSize
pure $ Env
{ _env_settings = settings
, _env_logger = logger
, _env_conn = conn
, _env_manager = manager
, _env_scrapers = scrapers_env
, _env_self_url = self_url
}
...@@ -18,6 +18,7 @@ module Gargantext.Core ...@@ -18,6 +18,7 @@ module Gargantext.Core
-- | Language of a Text -- | Language of a Text
-- For simplicity, we suppose text has an homogenous language -- For simplicity, we suppose text has an homogenous language
data Lang = EN | FR data Lang = EN | FR
-- | DE | IT | SP -- | DE | IT | SP
-- > EN == english -- > EN == english
-- > FR == french -- > FR == french
...@@ -26,4 +27,3 @@ data Lang = EN | FR ...@@ -26,4 +27,3 @@ data Lang = EN | FR
-- > SP == spanish (not implemented yet) -- > SP == spanish (not implemented yet)
-- > ... add your language and help us to implement it (: -- > ... add your language and help us to implement it (:
...@@ -31,7 +31,7 @@ import Data.Maybe (isJust, fromJust, maybe) ...@@ -31,7 +31,7 @@ import Data.Maybe (isJust, fromJust, maybe)
import Protolude ( Bool(True, False), Int, Double, Integer import Protolude ( Bool(True, False), Int, Double, Integer
, Fractional, Num, Maybe(Just,Nothing) , Fractional, Num, Maybe(Just,Nothing)
, Floating, Char, IO , Floating, Char, IO
, pure, (<$>), panic , pure, (<*>), (<$>), panic
, head, flip , head, flip
, Ord, Integral, Foldable, RealFrac, Monad, filter , Ord, Integral, Foldable, RealFrac, Monad, filter
, reverse, map, zip, drop, take, zipWith , reverse, map, zip, drop, take, zipWith
...@@ -42,9 +42,9 @@ import Protolude ( Bool(True, False), Int, Double, Integer ...@@ -42,9 +42,9 @@ import Protolude ( Bool(True, False), Int, Double, Integer
, Eq, (==), (>=), (<=), (<>), (/=) , Eq, (==), (>=), (<=), (<>), (/=)
, (&&), (||), not , (&&), (||), not
, fst, snd, toS , fst, snd, toS
, elem, die, mod, div, const , elem, die, mod, div, const, either
, curry, uncurry , curry, uncurry
, otherwise , otherwise, when
) )
-- TODO import functions optimized in Utils.Count -- TODO import functions optimized in Utils.Count
...@@ -231,37 +231,7 @@ zipFst f xs = zip (f xs) xs ...@@ -231,37 +231,7 @@ zipFst f xs = zip (f xs) xs
zipSnd :: ([a] -> [b]) -> [a] -> [(a, b)] zipSnd :: ([a] -> [b]) -> [a] -> [(a, b)]
zipSnd f xs = zip xs (f xs) zipSnd f xs = zip xs (f xs)
-- Just -- Just
unMaybe :: [Maybe a] -> [a] unMaybe :: [Maybe a] -> [a]
unMaybe = map fromJust . L.filter isJust unMaybe = map fromJust . L.filter isJust
-- | Syntactic convention for the reader/writer coordination.
-- @Motivation@: explicit functional flux ease coordination between
-- readers and writers who are not always the same individuals. Each
-- natural languages has its own syntaxical conventions from left to
-- right or the contrary. In computer programming languages it depends
-- on context of the algorithm itself and we need some clarity since
-- both are possible, here is a proposition to get more explicitiness.
-- | (<|) is called : "Pipe rightLeft" as "from right to left". The most right
-- function sends its output to the most left function which takes it as
-- input.
(<|) :: (a -> b) -> a -> b
(<|) = ($)
-- | (|>) is called : "Pipe leftRight" as "from left to right". The most left
-- function sends its output to the most right function which takes it as
-- input. (|>) == (&) = True -- in base prelude
(|>) :: a -> (a -> c) -> c
(|>) = flip ($)
-- | Function composition orientation
(<.) :: (b -> c) -> (a -> b) -> a -> c
(<.) = (.)
-- | Function composition orientation
(.>) :: (a -> b) -> (b -> c) -> a -> c
(.>) = flip (.)
...@@ -2,6 +2,7 @@ flags: {} ...@@ -2,6 +2,7 @@ flags: {}
extra-package-dbs: [] extra-package-dbs: []
packages: packages:
- . - .
- servant-job
allow-newer: true allow-newer: true
extra-deps: extra-deps:
...@@ -18,15 +19,16 @@ extra-deps: ...@@ -18,15 +19,16 @@ extra-deps:
- haskell-src-exts-1.18.2 - haskell-src-exts-1.18.2
- http-types-0.12.1 - http-types-0.12.1
- protolude-0.2 - protolude-0.2
- servant-0.12.1 - servant-0.13
- servant-auth-0.3.0.1 - servant-auth-0.3.0.1
- servant-client-0.12.0.1 - servant-client-0.13
- servant-client-core-0.12 - servant-client-core-0.13
- servant-docs-0.11.1 - servant-docs-0.11.1
- servant-multipart-0.11.1 - servant-multipart-0.11.1
- servant-server-0.12 - servant-server-0.13
- servant-swagger-ui-0.2.3.2.2.8 - servant-swagger-ui-0.2.3.2.2.8
- stemmer-0.5.2 - stemmer-0.5.2
- text-1.2.3.0 - text-1.2.3.0
- text-show-3.6.2 - text-show-3.6.2
- servant-flatten-0.2
resolver: lts-10.6 resolver: lts-10.6
Markdown is supported
0% or
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment