1
0
Fork 0
mirror of https://code.sup39.dev/repos/Wqawg synced 2025-01-04 07:24:50 +09:00
vervis/src/Vervis/Application.hs

332 lines
12 KiB
Haskell
Raw Normal View History

{- This file is part of Vervis.
-
- Written in 2016, 2018, 2019 by fr33domlover <fr33domlover@riseup.net>.
-
- Copying is an act of love. Please copy, reuse and share.
-
- The author(s) have dedicated all copyright and related and neighboring
- rights to this software to the public domain worldwide. This software is
- distributed without any warranty.
-
- You should have received a copy of the CC0 Public Domain Dedication along
- with this software. If not, see
- <http://creativecommons.org/publicdomain/zero/1.0/>.
-}
2016-02-13 12:35:30 +09:00
{-# OPTIONS_GHC -fno-warn-orphans #-}
module Vervis.Application
2016-02-13 12:35:30 +09:00
( getApplicationDev
, appMain
, develMain
, makeFoundation
, makeLogWare
-- * for DevelMain
, getApplicationRepl
, shutdownApp
-- * for GHCI
, handler
, db
)
where
2016-02-13 12:35:30 +09:00
import Control.Monad.Logger (liftLoc, runLoggingT, logInfo, logError)
2016-02-13 12:35:30 +09:00
import Database.Persist.Postgresql (createPostgresqlPool, pgConnStr,
pgPoolSize, runSqlPool)
import Graphics.SVGFonts.Fonts (lin2)
import Graphics.SVGFonts.ReadFont (loadFont)
import Vervis.Import
2016-02-13 12:35:30 +09:00
import Language.Haskell.TH.Syntax (qLocation)
import Network.HTTP.Client (newManager)
import Network.HTTP.Client.TLS (tlsManagerSettings)
2016-02-13 12:35:30 +09:00
import Network.Wai (Middleware)
import Network.Wai.Handler.Warp (Settings, defaultSettings,
defaultShouldDisplayException,
runSettings, setHost,
setOnException, setPort, getPort)
import Network.Wai.Middleware.RequestLogger (Destination (Logger),
IPAddrSource (..),
OutputFormat (..), destination,
mkRequestLogger, outputFormat)
import System.Log.FastLogger (defaultBufSize, newStdoutLoggerSet,
toLogStr)
import Yesod.Default.Main (LogFunc)
import Yesod.Mail.Send (runMailer)
2016-02-13 12:35:30 +09:00
import qualified Data.Text as T (unpack)
import qualified Data.HashMap.Strict as M (empty)
import Database.Persist.Schema.PostgreSQL (schemaBackend)
import Control.Concurrent.ResultShare
import Data.KeyFile
import Yesod.MonadSite
import Control.Concurrent.Local
import Web.Hashids.Local
import Vervis.ActorKey (generateActorKey, actorKeyRotator)
import Vervis.Federation
import Vervis.KeyFile (isInitialSetup)
import Vervis.RemoteActorStore
2016-02-13 12:35:30 +09:00
-- Import all relevant handler modules here.
-- Don't forget to add new modules to your cabal file!
import Vervis.Handler.Common
import Vervis.Handler.Git
2016-05-25 06:48:21 +09:00
import Vervis.Handler.Group
import Vervis.Handler.Home
import Vervis.Handler.Inbox
2016-03-07 09:42:06 +09:00
import Vervis.Handler.Key
import Vervis.Handler.Person
import Vervis.Handler.Project
2016-02-27 14:41:36 +09:00
import Vervis.Handler.Repo
import Vervis.Handler.Role
2016-05-25 06:48:21 +09:00
import Vervis.Handler.Sharer
2016-05-01 07:32:22 +09:00
import Vervis.Handler.Ticket
import Vervis.Handler.Wiki
import Vervis.Handler.Workflow
2016-02-13 12:35:30 +09:00
import Vervis.Migration (migrateDB)
2016-03-06 20:58:48 +09:00
import Vervis.Ssh (runSsh)
2016-02-13 12:35:30 +09:00
-- This line actually creates our YesodDispatch instance. It is the second half
-- of the call to mkYesodData which occurs in Foundation.hs. Please see the
-- comments there for more details.
mkYesodDispatch "App" resourcesApp
loggingFunction :: App -> LogFunc
loggingFunction app = messageLoggerSource app (appLogger app)
2016-02-13 12:35:30 +09:00
-- | This function allocates resources (such as a database connection pool),
-- performs initialization and returns a foundation datatype value. This is also
-- the place to put your migrate statements to have automatic database
-- migrations handled by Yesod.
makeFoundation :: AppSettings -> IO App
makeFoundation appSettings = do
-- Some basic initializations: HTTP connection manager, logger, and static
-- subsite.
appHttpManager <- newManager tlsManagerSettings
2016-02-13 12:35:30 +09:00
appLogger <- newStdoutLoggerSet defaultBufSize >>= makeYesodLogger
appStatic <-
(if appMutableStatic appSettings then staticDevel else static)
(appStaticDir appSettings)
2018-02-25 18:28:55 +09:00
appMailQueue <-
case appMail appSettings of
2018-02-25 18:28:55 +09:00
Nothing -> return Nothing
Just _ -> Just <$> newChan
appSvgFont <-
if appLoadFontFromLibData appSettings
2018-12-05 12:41:19 +09:00
then lin2
else loadFont "data/LinLibertineCut.svg"
appActorKeys <-
newTVarIO =<<
(,,) <$> generateActorKey <*> generateActorKey <*> pure True
appInstanceMutex <- newInstanceMutex
appActorFetchShare <- newResultShare actorFetchShareAction
appActivities <-
case appInboxDebugReportLength appSettings of
Nothing -> return Nothing
Just n -> Just . (n,) <$> newTVarIO mempty
2016-02-13 12:35:30 +09:00
-- We need a log function to create a connection pool. We need a connection
-- pool to create our foundation. And we need our foundation to get a
-- logging function. To get out of this loop, we initially create a
-- temporary foundation without a real connection pool, get a log function
-- from there, and then create the real foundation.
let mkFoundation
appConnPool
appCapSignKey
appHashidsContext =
App {..}
2016-02-13 12:35:30 +09:00
-- The App {..} syntax is an example of record wild cards. For more
-- information, see:
-- https://ocharles.org.uk/blog/posts/2014-12-04-record-wildcards.html
tempFoundation =
mkFoundation
(error "connPool forced in tempFoundation")
(error "capSignKey forced in tempFoundation")
(error "hashidsContext forced in tempFoundation")
logFunc = loggingFunction tempFoundation
2016-02-13 12:35:30 +09:00
-- Create the database connection pool
pool <- flip runLoggingT logFunc $ createPostgresqlPool
(pgConnStr $ appDatabaseConf appSettings)
(pgPoolSize $ appDatabaseConf appSettings)
setup <- isInitialSetup pool schemaBackend
loadMode <- determineKeyFileLoadMode setup
capSignKey <- loadKeyFile loadMode $ appCapabilitySigningKeyFile appSettings
hashidsSalt <- loadKeyFile loadMode $ appHashidsSaltFile appSettings
let hashidsCtx = hashidsContext hashidsSalt
2016-02-13 12:35:30 +09:00
-- Perform database migration using our application's logging settings.
--runLoggingT (runSqlPool (runMigration migrateAll) pool) logFunc
flip runLoggingT logFunc $
flip runSqlPool pool $ do
let hLocal = appInstanceHost appSettings
r <- migrateDB hLocal hashidsCtx
case r of
Left err -> do
let msg = "DB migration failed: " <> err
$logError msg
error $ T.unpack msg
Right (_from, _to) -> do
$logInfo "DB migration success"
fixRunningDeliveries
deleteUnusedURAs
2016-02-13 12:35:30 +09:00
-- Return the foundation
return $ mkFoundation pool capSignKey hashidsCtx
2016-02-13 12:35:30 +09:00
-- | Convert our foundation to a WAI Application by calling @toWaiAppPlain@ and
-- applying some additional middlewares.
makeApplication :: App -> IO Application
makeApplication foundation = do
logWare <- makeLogWare foundation
-- Create the WAI application and apply middlewares
appPlain <- toWaiAppPlain foundation
return $ logWare $ defaultMiddlewaresNoLogging appPlain
makeLogWare :: App -> IO Middleware
makeLogWare foundation =
mkRequestLogger def
{ outputFormat =
if appDetailedRequestLogging $ appSettings foundation
then Detailed True
else Apache
(if appIpFromHeader $ appSettings foundation
then FromFallback
else FromSocket)
, destination = Logger $ loggerSet $ appLogger foundation
}
-- | Warp settings for the given foundation value.
warpSettings :: App -> Settings
warpSettings foundation =
setPort (appPort $ appSettings foundation)
$ setHost (appHost $ appSettings foundation)
$ setOnException (\_req e ->
when (defaultShouldDisplayException e) $ loggingFunction
2016-02-13 12:35:30 +09:00
foundation
$(qLocation >>= liftLoc)
"yesod"
LevelError
(toLogStr $ "Exception from Warp: " ++ show e))
defaultSettings
-- | For yesod devel, return the Warp settings and WAI Application.
getApplicationDev :: IO (Settings, Application)
getApplicationDev = do
settings <- getAppSettings
foundation <- makeFoundation settings
wsettings <- getDevSettings $ warpSettings foundation
app <- makeApplication foundation
return (wsettings, app)
getAppSettings :: IO AppSettings
getAppSettings = loadYamlSettings [configSettingsYml] [] useEnv
2016-02-13 12:35:30 +09:00
-- | main function for use by yesod devel
develMain :: IO ()
develMain = develMainHelper getApplicationDev
actorKeyPeriodicRotator :: App -> IO ()
actorKeyPeriodicRotator app =
actorKeyRotator (appActorKeyRotation $ appSettings app) (appActorKeys app)
deliveryRunner :: App -> IO ()
deliveryRunner app =
let interval = appDeliveryRetryFreq $ appSettings app
in runWorker (periodically interval retryOutboxDelivery) app
sshServer :: App -> IO ()
sshServer foundation =
runSsh
(appSettings foundation)
(appConnPool foundation)
(loggingFunction foundation)
2018-02-25 18:28:55 +09:00
mailer :: App -> IO ()
mailer foundation =
case (appMail $ appSettings foundation, appMailQueue foundation) of
2018-02-25 18:28:55 +09:00
(Nothing , Nothing) -> return ()
(Nothing , Just _) -> error "Mail queue unnecessarily created"
(Just _ , Nothing) -> error "Mail queue wasn't created"
(Just mail, Just queue) ->
2018-02-25 18:28:55 +09:00
runMailer
mail
-- (appConnPool foundation)
2018-02-25 18:28:55 +09:00
(loggingFunction foundation)
(readChan queue)
2016-02-13 12:35:30 +09:00
-- | The @main@ function for an executable running this site.
appMain :: IO ()
appMain = do
-- Get the settings from all relevant sources
settings <- loadYamlSettingsArgs
2016-03-06 20:58:48 +09:00
-- Fall back to compile-time values, set to [] to require values at
-- runtime
2016-02-13 12:35:30 +09:00
[configSettingsYmlValue]
2016-03-06 20:58:48 +09:00
-- Allow environment variables to override
2016-02-13 12:35:30 +09:00
useEnv
-- Generate the foundation from the settings
foundation <- makeFoundation settings
-- Generate a WAI Application from the foundation
app <- makeApplication foundation
-- Run actor signature key periodic generation thread
forkCheck $ actorKeyPeriodicRotator foundation
-- Run periodic activity delivery retry runner
when (appFederation $ appSettings foundation) $
forkCheck $ deliveryRunner foundation
2018-02-25 18:28:55 +09:00
-- Run SSH server
forkCheck $ sshServer foundation
2016-03-06 20:58:48 +09:00
2018-02-25 18:28:55 +09:00
-- Run mailer if SMTP is enabled
forkCheck $ mailer foundation
2018-02-25 18:28:55 +09:00
2016-02-13 12:35:30 +09:00
-- Run the application with Warp
runSettings (warpSettings foundation) app
--------------------------------------------------------------
-- Functions for DevelMain.hs (a way to run the app from GHCi)
--------------------------------------------------------------
getApplicationRepl :: IO (Int, App, Application)
getApplicationRepl = do
settings <- getAppSettings
foundation <- makeFoundation settings
wsettings <- getDevSettings $ warpSettings foundation
app1 <- makeApplication foundation
return (getPort wsettings, foundation, app1)
shutdownApp :: App -> IO ()
shutdownApp _ = return ()
---------------------------------------------
-- Functions for use in development with GHCi
---------------------------------------------
-- | Run a handler
handler :: Handler a -> IO a
handler h = getAppSettings >>= makeFoundation >>= flip unsafeHandler h
-- | Run DB queries
db :: ReaderT SqlBackend (HandlerFor App) a -> IO a
2016-02-13 12:35:30 +09:00
db = handler . runDB