mirror of
https://code.sup39.dev/repos/Wqawg
synced 2025-01-03 03:34:51 +09:00
b0da8747a2
Before this patch, the shared fetch used plain insert, because it relied on being the only place in the codebase where new RemoteActors get inserted. I was hoping for that to be the case, but while I tweak things and handle fetching URIs that can be an actor or a public key (for which ActorFetchShare isn't sufficient without some smart modification), I'd like concurrent insertions to be safe, without getting in the way of ActorFetchShare. With this patch, it now uses insertBy', which doesn't mind concurrent insertions.
496 lines
19 KiB
Haskell
496 lines
19 KiB
Haskell
{- This file is part of Vervis.
|
|
-
|
|
- Written in 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/>.
|
|
-}
|
|
|
|
-- | This module collects functions for working with the storage of remote
|
|
-- instances, actors and their details in our local database.
|
|
module Vervis.RemoteActorStore
|
|
( InstanceMutex ()
|
|
, newInstanceMutex
|
|
, YesodRemoteActorStore (..)
|
|
, withHostLock
|
|
, keyListedByActorShared
|
|
, VerifKeyDetail (..)
|
|
, addVerifKey
|
|
, actorFetchShareSettings
|
|
, fetchRemoteActor
|
|
, deleteUnusedURAs
|
|
)
|
|
where
|
|
|
|
import Prelude
|
|
|
|
import Control.Concurrent.MVar (MVar, newMVar)
|
|
import Control.Concurrent.ResultShare
|
|
import Control.Concurrent.STM.TVar
|
|
import Control.Exception
|
|
import Control.Monad
|
|
import Control.Monad.Logger.CallStack
|
|
import Control.Monad.STM
|
|
import Control.Monad.Trans.Except
|
|
import Data.Foldable
|
|
import Data.HashMap.Strict (HashMap)
|
|
import Data.Maybe
|
|
import Data.Text (Text)
|
|
import Data.Time.Clock
|
|
import Data.Traversable
|
|
import Database.Persist
|
|
import Database.Persist.Sql
|
|
import Network.HTTP.Client
|
|
import UnliftIO.MVar (withMVar)
|
|
import Yesod.Core hiding (logWarn, logError)
|
|
import Yesod.Persist.Core
|
|
|
|
import qualified Data.HashMap.Strict as M
|
|
import qualified Data.Text as T
|
|
import qualified Database.Esqueleto as E
|
|
|
|
import Crypto.PublicVerifKey
|
|
import Database.Persist.Local
|
|
import Network.FedURI
|
|
import Web.ActivityPub
|
|
|
|
import Vervis.Model
|
|
|
|
newtype InstanceMutex = InstanceMutex (TVar (HashMap Text (MVar ())))
|
|
|
|
newInstanceMutex :: IO InstanceMutex
|
|
newInstanceMutex = InstanceMutex <$> newTVarIO M.empty
|
|
|
|
data RoomModeDB
|
|
= RoomModeNoLimit
|
|
| RoomModeLimit Int
|
|
|
|
data RoomMode
|
|
= RoomModeInstant
|
|
| RoomModeCached RoomModeDB
|
|
|
|
class Yesod site => YesodRemoteActorStore site where
|
|
siteInstanceMutex :: site -> InstanceMutex
|
|
siteInstanceRoomMode :: site -> Maybe Int
|
|
siteActorRoomMode :: site -> Maybe Int
|
|
siteRejectOnMaxKeys :: site -> Bool
|
|
|
|
siteActorFetchShare :: site -> ResultShare (HandlerFor site) FedURI (Either (Maybe APGetError) (Entity RemoteActor)) InstanceId
|
|
|
|
-- TODO this is copied from stm-2.5, remove when we upgrade LTS
|
|
stateTVar :: TVar s -> (s -> (a, s)) -> STM a
|
|
stateTVar var f = do
|
|
s <- readTVar var
|
|
let (a, s') = f s -- since we destructure this, we are strict in f
|
|
writeTVar var s'
|
|
return a
|
|
|
|
withHostLock
|
|
:: ( MonadHandler m
|
|
, MonadUnliftIO m
|
|
, HandlerSite m ~ site
|
|
, YesodRemoteActorStore site
|
|
)
|
|
=> Text
|
|
-> m a
|
|
-> m a
|
|
withHostLock host action = do
|
|
InstanceMutex tvar <- getsYesod siteInstanceMutex
|
|
mvar <- liftIO $ do
|
|
existing <- M.lookup host <$> readTVarIO tvar
|
|
case existing of
|
|
Just v -> return v
|
|
Nothing -> do
|
|
v <- newMVar ()
|
|
atomically $ stateTVar tvar $ \ m ->
|
|
case M.lookup host m of
|
|
Just v' -> (v', m)
|
|
Nothing -> (v, M.insert host v m)
|
|
withMVar mvar $ const action
|
|
|
|
sumUpTo :: Int -> YesodDB site Int -> YesodDB site Int -> YesodDB site Bool
|
|
sumUpTo limit action1 action2 = do
|
|
n <- action1
|
|
if n <= limit
|
|
then do
|
|
m <- action2
|
|
return $ n + m <= limit
|
|
else return False
|
|
|
|
-- | Grab instance and remote sharer IDs from the DB, inserting new ones if
|
|
-- they can't be found in the DB. The @Maybe Bool@ indicates whether the IDs
|
|
-- are newly inserted record: 'Nothing' means they're both new. @Just True@
|
|
-- means the instance record existed but the remote sharer is new. @Just False@
|
|
-- means both the instance and remote sharer existed in the DB.
|
|
instanceAndActor
|
|
:: ( PersistUniqueWrite (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> Text
|
|
-> LocalURI
|
|
-> LocalURI
|
|
-> YesodDB site (InstanceId, RemoteActorId, Maybe Bool)
|
|
instanceAndActor host luActor luInbox = do
|
|
(iid, inew) <- idAndNew <$> insertBy (Instance host)
|
|
let rs = RemoteActor luActor iid luInbox Nothing
|
|
if inew
|
|
then do
|
|
rsid <- insert rs
|
|
return (iid, rsid, Nothing)
|
|
else do
|
|
(rsid, rsnew) <- idAndNew <$> insertBy rs
|
|
return (iid, rsid, Just rsnew)
|
|
|
|
actorRoom
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> Int
|
|
-> RemoteActorId
|
|
-> YesodDB site Bool
|
|
actorRoom limit rsid = do
|
|
sumUpTo limit
|
|
(count [VerifKeySharedUsageUser ==. rsid])
|
|
(count [VerifKeySharer ==. Just rsid])
|
|
|
|
getOldUsageId
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> RemoteActorId
|
|
-> YesodDB site (Maybe VerifKeySharedUsageId)
|
|
getOldUsageId rsid = fmap entityKey . listToMaybe <$> selectList [VerifKeySharedUsageUser ==. rsid] [Asc VerifKeySharedUsageId, LimitTo 1]
|
|
|
|
getOldPersonalKeyId
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> RemoteActorId
|
|
-> YesodDB site (Maybe VerifKeyId)
|
|
getOldPersonalKeyId rsid = fmap entityKey . listToMaybe <$> selectList [VerifKeySharer ==. Just rsid] [Asc VerifKeyExpires, Asc VerifKeyId, LimitTo 1]
|
|
|
|
makeActorRoomByPersonal
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, PersistStoreWrite (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> Int
|
|
-> RemoteActorId
|
|
-> VerifKeyId
|
|
-> YesodDB site ()
|
|
makeActorRoomByPersonal limit rsid vkid = do
|
|
room <-
|
|
if limit <= 1
|
|
then return False
|
|
else (< limit-1) <$> count [VerifKeySharer ==. Just rsid, VerifKeyId !=. vkid]
|
|
unless room $ delete vkid
|
|
|
|
makeActorRoomByUsage
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, PersistStoreWrite (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> Int
|
|
-> RemoteActorId
|
|
-> VerifKeySharedUsageId
|
|
-> YesodDB site ()
|
|
makeActorRoomByUsage limit rsid suid = do
|
|
room <-
|
|
if limit <= 1
|
|
then return False
|
|
else
|
|
sumUpTo (limit-1)
|
|
(count [VerifKeySharedUsageUser ==. rsid, VerifKeySharedUsageId !=. suid])
|
|
(count [VerifKeySharer ==. Just rsid])
|
|
unless room $ delete suid
|
|
|
|
-- | Checks whether the given actor has room left for a new shared key usage
|
|
-- record, and if not, deletes a record to make room for a new one. It prefers
|
|
-- to delete a usage record if any exist; otherwise it deletes a personal key.
|
|
--
|
|
-- The first parameter is the actor key storage limit, and it must be above
|
|
-- zero.
|
|
makeActorRoomForUsage
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, PersistStoreWrite (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> Int
|
|
-> RemoteActorId
|
|
-> YesodDB site ()
|
|
makeActorRoomForUsage limit rsid = do
|
|
msuid <- getOldUsageId rsid
|
|
case msuid of
|
|
Nothing -> do
|
|
mvkid <- getOldPersonalKeyId rsid
|
|
case mvkid of
|
|
Nothing -> return ()
|
|
Just vkid -> makeActorRoomByPersonal limit rsid vkid
|
|
Just suid -> makeActorRoomByUsage limit rsid suid
|
|
|
|
-- | Checks whether the given actor has room left for a new personal key
|
|
-- record, and if not, deletes a record to make room for a new one. It prefers
|
|
-- to delete a personal key if any exist; otherwise it deletes a usage record.
|
|
--
|
|
-- The first parameter is the actor key storage limit, and it must be above
|
|
-- zero.
|
|
makeActorRoomForPersonalKey
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, PersistStoreWrite (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> Int
|
|
-> RemoteActorId
|
|
-> YesodDB site ()
|
|
makeActorRoomForPersonalKey limit rsid = do
|
|
mvkid <- getOldPersonalKeyId rsid
|
|
case mvkid of
|
|
Nothing -> do
|
|
msuid <- getOldUsageId rsid
|
|
case msuid of
|
|
Nothing -> return ()
|
|
Just suid -> makeActorRoomByUsage limit rsid suid
|
|
Just vkid -> makeActorRoomByPersonal limit rsid vkid
|
|
|
|
-- | Checks whether the given instance has room left for a new shared key
|
|
-- record, and if not, deletes a record to make room for a new one.
|
|
--
|
|
-- The first parameter is the actor key storage limit, and it must be above
|
|
-- zero.
|
|
makeInstanceRoom
|
|
:: ( PersistQueryRead (YesodPersistBackend site)
|
|
, PersistStoreWrite (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
)
|
|
=> Int
|
|
-> InstanceId
|
|
-> YesodDB site ()
|
|
makeInstanceRoom limit iid = do
|
|
mvk <- listToMaybe <$> selectList [VerifKeyInstance ==. iid, VerifKeySharer ==. Nothing] [Asc VerifKeyExpires, Asc VerifKeyId, LimitTo 1]
|
|
case mvk of
|
|
Nothing -> return ()
|
|
Just (Entity vkid _) -> do
|
|
room <-
|
|
if limit <= 1
|
|
then return False
|
|
else (< limit-1) <$> count [VerifKeyInstance ==. iid, VerifKeySharer ==. Nothing, VerifKeyId !=. vkid]
|
|
unless room $ delete vkid
|
|
|
|
roomModeFromLimit :: Maybe Int -> RoomMode
|
|
roomModeFromLimit Nothing = RoomModeCached $ RoomModeNoLimit
|
|
roomModeFromLimit (Just limit) =
|
|
if limit <= 0
|
|
then RoomModeInstant
|
|
else RoomModeCached $ RoomModeLimit limit
|
|
|
|
-- | Given a shared key we have in our DB, verify that the given actor lists
|
|
-- this key, and update the DB accordingly.
|
|
--
|
|
-- * If the storage limit on actor keys is zero:
|
|
-- - If we're supposed to reject signatures when there's no room, raise
|
|
-- an error! We can't store anything with a limit of 0
|
|
-- - Otherwise, fetch the actor, store in DB if we don't have it, verify
|
|
-- usage via actor JSON. Usage isn't stored in the DB.
|
|
-- * If there's no storage limit, or it's above zero:
|
|
-- - If we know the actor and we have a record that it lists the key,
|
|
-- return success, no other action
|
|
-- - If we know the actor but we don't have a record of usage, fetch the
|
|
-- actor and verify usage. If the actor already has the maximal number of
|
|
-- keys: If we're supposed to reject signatures when there's no room,
|
|
-- raise an error. Otherwise, delete an old key/usage and store the new
|
|
-- usage in the DB.
|
|
-- - If we don't know the actor, fetch actor, verify usage, store actor and
|
|
-- usage in DB.
|
|
--
|
|
-- If we get success, that means the actor lists the key, and both the actor
|
|
-- and the usage exist in our DB now (if the storage limit isn't zero).
|
|
keyListedByActorShared
|
|
:: ( HasHttpManager site
|
|
, YesodPersist site
|
|
, YesodRemoteActorStore site
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
, PersistQueryRead (YesodPersistBackend site)
|
|
, PersistUniqueWrite (YesodPersistBackend site)
|
|
)
|
|
=> InstanceId
|
|
-> VerifKeyId
|
|
-> Text
|
|
-> LocalURI
|
|
-> LocalURI
|
|
-> ExceptT String (HandlerFor site) RemoteActorId
|
|
keyListedByActorShared iid vkid host luKey luActor = do
|
|
manager <- getsYesod getHttpManager
|
|
reject <- getsYesod siteRejectOnMaxKeys
|
|
roomMode <- getsYesod $ roomModeFromLimit . siteActorRoomMode
|
|
case roomMode of
|
|
RoomModeInstant -> do
|
|
when reject $ throwE "Actor key storage limit is 0 and set to reject"
|
|
luInbox <- actorInbox <$> ExceptT (keyListedByActor manager host luKey luActor)
|
|
lift $ runDB $ either entityKey id <$> insertBy (RemoteActor luActor iid luInbox Nothing)
|
|
RoomModeCached m -> do
|
|
eresult <- do
|
|
ments <- lift $ runDB $ do
|
|
mrs <- getBy $ UniqueRemoteActor iid luActor
|
|
for mrs $ \ (Entity rsid _) ->
|
|
(rsid,) . isJust <$>
|
|
getBy (UniqueVerifKeySharedUsage vkid rsid)
|
|
return $
|
|
case ments of
|
|
Nothing -> Right Nothing
|
|
Just (rsid, used) ->
|
|
if used
|
|
then Left rsid
|
|
else Right $ Just rsid
|
|
case eresult of
|
|
Left rsid -> return rsid
|
|
Right mrsid -> do
|
|
luInbox <- actorInbox <$> ExceptT (keyListedByActor manager host luKey luActor)
|
|
ExceptT $ runDB $ do
|
|
vkExists <- isJust <$> get vkid
|
|
case mrsid of
|
|
Nothing -> do
|
|
rsid <- insert $ RemoteActor luActor iid luInbox Nothing
|
|
when vkExists $ insert_ $ VerifKeySharedUsage vkid rsid
|
|
return $ Right rsid
|
|
Just rsid -> runExceptT $ do
|
|
when vkExists $ do
|
|
case m of
|
|
RoomModeNoLimit -> return ()
|
|
RoomModeLimit limit -> do
|
|
if reject
|
|
then do
|
|
room <- lift $ actorRoom limit rsid
|
|
unless room $ throwE "Actor key storage limit reached"
|
|
else lift $ makeActorRoomForUsage limit rsid
|
|
lift $ insert_ $ VerifKeySharedUsage vkid rsid
|
|
return rsid
|
|
|
|
data VerifKeyDetail = VerifKeyDetail
|
|
{ vkdKeyId :: LocalURI
|
|
, vkdKey :: PublicVerifKey
|
|
, vkdExpires :: Maybe UTCTime
|
|
, vkdActorId :: LocalURI
|
|
, vkdShared :: Bool
|
|
}
|
|
|
|
addVerifKey
|
|
:: ( YesodRemoteActorStore site
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
, PersistQueryRead (YesodPersistBackend site)
|
|
, PersistUniqueWrite (YesodPersistBackend site)
|
|
)
|
|
=> Text
|
|
-> LocalURI
|
|
-> VerifKeyDetail
|
|
-> ExceptT String (YesodDB site) (InstanceId, RemoteActorId)
|
|
addVerifKey h uinb vkd =
|
|
if vkdShared vkd
|
|
then addSharedKey h uinb vkd
|
|
else addPersonalKey h uinb vkd
|
|
where
|
|
addSharedKey host luInbox (VerifKeyDetail luKey key mexpires luActor _) = do
|
|
reject <- getsYesod siteRejectOnMaxKeys
|
|
roomModeA <- getsYesod $ roomModeFromLimit . siteActorRoomMode
|
|
roomModeI <- getsYesod $ roomModeFromLimit . siteInstanceRoomMode
|
|
(iid, rsid, inew) <- lift $ instanceAndActor host luActor luInbox
|
|
case roomModeI of
|
|
RoomModeInstant ->
|
|
when reject $ throwE "Instance key storage limit is 0 and set to reject"
|
|
RoomModeCached m -> do
|
|
case m of
|
|
RoomModeNoLimit -> return ()
|
|
RoomModeLimit limit ->
|
|
if reject
|
|
then when (isJust inew) $ do
|
|
room <- lift $ instanceRoom limit iid
|
|
unless room $ throwE "Instance key storage limit reached"
|
|
else when (isJust inew) $ lift $ makeInstanceRoom limit iid
|
|
vkid <- lift $ insert $ VerifKey luKey iid mexpires key Nothing
|
|
case roomModeA of
|
|
RoomModeInstant ->
|
|
when reject $ throwE "Actor key storage limit is 0 and set to reject"
|
|
RoomModeCached m -> do
|
|
case m of
|
|
RoomModeNoLimit -> return ()
|
|
RoomModeLimit limit ->
|
|
if reject
|
|
then when (inew == Just False) $ do
|
|
room <- lift $ actorRoom limit rsid
|
|
unless room $ throwE "Actor key storage limit reached"
|
|
else when (inew == Just False) $ lift $ makeActorRoomForUsage limit rsid
|
|
lift $ insert_ $ VerifKeySharedUsage vkid rsid
|
|
return (iid, rsid)
|
|
where
|
|
instanceRoom n iid =
|
|
(< n) <$> count [VerifKeyInstance ==. iid, VerifKeySharer ==. Nothing]
|
|
addPersonalKey host luInbox (VerifKeyDetail luKey key mexpires luActor _) = do
|
|
reject <- getsYesod siteRejectOnMaxKeys
|
|
roomMode <- getsYesod $ roomModeFromLimit . siteActorRoomMode
|
|
(iid, rsid, inew) <- lift $ instanceAndActor host luActor luInbox
|
|
case roomMode of
|
|
RoomModeInstant ->
|
|
when reject $ throwE "Actor key storage limit is 0 and set to reject"
|
|
RoomModeCached m -> do
|
|
case m of
|
|
RoomModeNoLimit -> return ()
|
|
RoomModeLimit limit ->
|
|
if reject
|
|
then when (inew == Just False) $ do
|
|
room <- lift $ actorRoom limit rsid
|
|
unless room $ throwE "Actor key storage limit reached"
|
|
else when (inew == Just False) $ lift $ makeActorRoomForPersonalKey limit rsid
|
|
lift $ insert_ $ VerifKey luKey iid mexpires key (Just rsid)
|
|
return (iid, rsid)
|
|
|
|
actorFetchShareSettings
|
|
:: ( YesodPersist site
|
|
, PersistUniqueWrite (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
, HasHttpManager site
|
|
)
|
|
=> ResultShareSettings (HandlerFor site) FedURI (Either (Maybe APGetError) (Entity RemoteActor)) InstanceId
|
|
actorFetchShareSettings = ResultShareSettings
|
|
{ resultShareFork = forkHandler $ \ e -> logError $ "ActorFetchShare action failed! " <> T.pack (displayException e)
|
|
, resultShareAction = \ u iid -> do
|
|
let (h, lu) = f2l u
|
|
mers <- runDB $ getBy $ UniqueRemoteActor iid lu
|
|
case mers of
|
|
Just ers -> return $ Right ers
|
|
Nothing -> do
|
|
manager <- getsYesod getHttpManager
|
|
eactor <- fetchAPID' manager actorId h lu
|
|
for eactor $ \ actor -> runDB $
|
|
let ra = RemoteActor lu iid (actorInbox actor) Nothing
|
|
in either id (flip Entity ra) <$> insertBy' ra
|
|
}
|
|
|
|
fetchRemoteActor
|
|
:: ( YesodPersist site
|
|
, PersistUniqueRead (YesodPersistBackend site)
|
|
, BaseBackend (YesodPersistBackend site) ~ SqlBackend
|
|
, YesodRemoteActorStore site
|
|
)
|
|
=> InstanceId -> Text -> LocalURI -> HandlerFor site (Either (Maybe APGetError) (Entity RemoteActor))
|
|
fetchRemoteActor iid host luActor = do
|
|
mers <- runDB $ getBy $ UniqueRemoteActor iid luActor
|
|
case mers of
|
|
Just ers -> return $ Right ers
|
|
Nothing -> do
|
|
afs <- getsYesod siteActorFetchShare
|
|
runShared afs (l2f host luActor) iid
|
|
|
|
deleteUnusedURAs = do
|
|
uraids <- E.select $ E.from $ \ ura -> do
|
|
E.where_ $ E.notExists $ E.from $ \ udl ->
|
|
E.where_ $ ura E.^. UnfetchedRemoteActorId E.==. udl E.^. UnlinkedDeliveryRecipient
|
|
return $ ura E.^. UnfetchedRemoteActorId
|
|
unless (null uraids) $ do
|
|
deleteWhere [UnfetchedRemoteActorId <-. map E.unValue uraids]
|
|
logWarn $ T.pack (show $ length uraids) <> " unused URAs deleted"
|