use Utility.PID
fixes build on i386ancient
This commit is contained in:
parent
3b74386ed4
commit
35ff8c8c00
2 changed files with 5 additions and 5 deletions
|
@ -18,9 +18,9 @@ import Annex.LockFile
|
|||
import Annex.LockPool
|
||||
import qualified Database.RepoSize as Db
|
||||
import qualified Utility.Matcher as Matcher
|
||||
import Utility.PID
|
||||
|
||||
import Control.Concurrent
|
||||
import System.Process
|
||||
import Text.Read
|
||||
import Data.Time.Clock.POSIX
|
||||
import qualified Utility.RawFilePath as R
|
||||
|
@ -61,7 +61,7 @@ prepareLiveUpdate mu k sc = do
|
|||
waitstart startv readyv donev h u =
|
||||
tryNonAsync (takeMVar startv) >>= \case
|
||||
Right () -> do
|
||||
pid <- getCurrentPid
|
||||
pid <- getPID
|
||||
cid <- mkSizeChangeId pid
|
||||
Db.startingLiveSizeChange h u k sc cid
|
||||
putMVar readyv ()
|
||||
|
@ -145,7 +145,7 @@ finishedLiveUpdate lu u k sc =
|
|||
checkStaleSizeChanges :: RepoSizeHandle -> Annex ()
|
||||
checkStaleSizeChanges h@(RepoSizeHandle (Just _) livev) = do
|
||||
livedir <- calcRepo' gitAnnexRepoSizeLiveDir
|
||||
pid <- liftIO getCurrentPid
|
||||
pid <- liftIO getPID
|
||||
let pidlockfile = show pid
|
||||
now <- liftIO getPOSIXTime
|
||||
liftIO (takeMVar livev) >>= \case
|
||||
|
|
|
@ -11,12 +11,12 @@ module Types.RepoSize where
|
|||
|
||||
import Types.UUID
|
||||
import Types.Key
|
||||
import Utility.PID
|
||||
|
||||
import Control.Concurrent
|
||||
import Database.Persist.Sql hiding (Key)
|
||||
import Data.Unique
|
||||
import Text.Read
|
||||
import System.Process (Pid)
|
||||
import qualified Data.Text as T
|
||||
import qualified Data.Set as S
|
||||
|
||||
|
@ -75,7 +75,7 @@ newtype SizeChangeUniqueId = SizeChangeUniqueId Int
|
|||
newtype SizeChangeProcessId = SizeChangeProcessId Integer
|
||||
deriving (Show, Eq, Ord)
|
||||
|
||||
mkSizeChangeId :: Pid -> IO SizeChangeId
|
||||
mkSizeChangeId :: PID -> IO SizeChangeId
|
||||
mkSizeChangeId pid = do
|
||||
u <- newUnique
|
||||
return $ SizeChangeId
|
||||
|
|
Loading…
Add table
Add a link
Reference in a new issue