module Unison.Codebase.Watch
( watchDirectory,
)
where
import Control.Concurrent (threadDelay)
import Control.Concurrent.STM qualified as STM
import Control.Exception (MaskingState (..))
import Data.IORef (newIORef, readIORef, writeIORef)
import Data.Map qualified as Map
import Data.Time.Clock (UTCTime, diffUTCTime)
import GHC.Conc (registerDelay)
import GHC.IO (unsafeUnmask)
import Ki qualified
import System.FSNotify (Event (Added, Modified))
import System.FSNotify qualified as FSNotify
import Unison.Prelude
import UnliftIO.Exception (finally, tryAny)
import UnliftIO.STM (atomically)
watchDirectory :: Ki.Scope -> FSNotify.WatchManager -> FilePath -> (FilePath -> Bool) -> IO (IO (FilePath, Text))
watchDirectory :: Scope
-> WatchManager
-> FilePath
-> (FilePath -> Bool)
-> IO (IO (FilePath, Text))
watchDirectory Scope
scope WatchManager
mgr FilePath
dir FilePath -> Bool
allow = do
TQueue (FilePath, UTCTime)
eventQueue <- Scope
-> WatchManager
-> FilePath
-> (FilePath -> Bool)
-> IO (TQueue (FilePath, UTCTime))
forkDirWatcherThread Scope
scope WatchManager
mgr FilePath
dir FilePath -> Bool
allow
let awaitEvent0 :: IO (FilePath, UTCTime)
awaitEvent0 :: IO (FilePath, UTCTime)
awaitEvent0 = do
let go :: (FilePath, UTCTime) -> IO (FilePath, UTCTime)
go :: (FilePath, UTCTime) -> IO (FilePath, UTCTime)
go (FilePath, UTCTime)
event0 = do
TVar Bool
var <- Int -> IO (TVar Bool)
registerDelay Int
50_000
(IO (IO (FilePath, UTCTime)) -> IO (FilePath, UTCTime)
forall (m :: * -> *) a. Monad m => m (m a) -> m a
join (IO (IO (FilePath, UTCTime)) -> IO (FilePath, UTCTime))
-> ([STM (IO (FilePath, UTCTime))] -> IO (IO (FilePath, UTCTime)))
-> [STM (IO (FilePath, UTCTime))]
-> IO (FilePath, UTCTime)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. STM (IO (FilePath, UTCTime)) -> IO (IO (FilePath, UTCTime))
forall (m :: * -> *) a. MonadIO m => STM a -> m a
atomically (STM (IO (FilePath, UTCTime)) -> IO (IO (FilePath, UTCTime)))
-> ([STM (IO (FilePath, UTCTime))] -> STM (IO (FilePath, UTCTime)))
-> [STM (IO (FilePath, UTCTime))]
-> IO (IO (FilePath, UTCTime))
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [STM (IO (FilePath, UTCTime))] -> STM (IO (FilePath, UTCTime))
forall (t :: * -> *) (f :: * -> *) a.
(Foldable t, Alternative f) =>
t (f a) -> f a
asum)
[ do
(FilePath, UTCTime)
event1 <- TQueue (FilePath, UTCTime) -> STM (FilePath, UTCTime)
forall a. TQueue a -> STM a
STM.readTQueue TQueue (FilePath, UTCTime)
eventQueue
IO (FilePath, UTCTime) -> STM (IO (FilePath, UTCTime))
forall a. a -> STM a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ((FilePath, UTCTime) -> IO (FilePath, UTCTime)
go (FilePath, UTCTime)
event1),
do
TVar Bool -> STM Bool
forall a. TVar a -> STM a
STM.readTVar TVar Bool
var STM Bool -> (Bool -> STM ()) -> STM ()
forall a b. STM a -> (a -> STM b) -> STM b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= Bool -> STM ()
STM.check
IO (FilePath, UTCTime) -> STM (IO (FilePath, UTCTime))
forall a. a -> STM a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ((FilePath, UTCTime) -> IO (FilePath, UTCTime)
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (FilePath, UTCTime)
event0)
]
(FilePath, UTCTime)
event <- STM (FilePath, UTCTime) -> IO (FilePath, UTCTime)
forall (m :: * -> *) a. MonadIO m => STM a -> m a
atomically (TQueue (FilePath, UTCTime) -> STM (FilePath, UTCTime)
forall a. TQueue a -> STM a
STM.readTQueue TQueue (FilePath, UTCTime)
eventQueue)
(FilePath, UTCTime) -> IO (FilePath, UTCTime)
go (FilePath, UTCTime)
event
IORef (Map FilePath (Text, UTCTime))
previousFilesRef <- Map FilePath (Text, UTCTime)
-> IO (IORef (Map FilePath (Text, UTCTime)))
forall a. a -> IO (IORef a)
newIORef Map FilePath (Text, UTCTime)
forall k a. Map k a
Map.empty
let awaitEvent1 :: IO (FilePath, Text)
awaitEvent1 :: IO (FilePath, Text)
awaitEvent1 = do
(FilePath
file, UTCTime
t) <- IO (FilePath, UTCTime)
awaitEvent0
IO Text -> IO (Either SomeException Text)
forall (m :: * -> *) a.
MonadUnliftIO m =>
m a -> m (Either SomeException a)
tryAny (FilePath -> IO Text
readUtf8 FilePath
file) IO (Either SomeException Text)
-> (Either SomeException Text -> IO (FilePath, Text))
-> IO (FilePath, Text)
forall a b. IO a -> (a -> IO b) -> IO b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= \case
Left SomeException
_ -> IO (FilePath, Text)
awaitEvent1
Right Text
contents -> do
Map FilePath (Text, UTCTime)
previousFiles <- IORef (Map FilePath (Text, UTCTime))
-> IO (Map FilePath (Text, UTCTime))
forall a. IORef a -> IO a
readIORef IORef (Map FilePath (Text, UTCTime))
previousFilesRef
case FilePath -> Map FilePath (Text, UTCTime) -> Maybe (Text, UTCTime)
forall k a. Ord k => k -> Map k a -> Maybe a
Map.lookup FilePath
file Map FilePath (Text, UTCTime)
previousFiles of
Just (Text
contents0, UTCTime
t0) | Text
contents Text -> Text -> Bool
forall a. Eq a => a -> a -> Bool
== Text
contents0 Bool -> Bool -> Bool
&& (UTCTime
t UTCTime -> UTCTime -> NominalDiffTime
`diffUTCTime` UTCTime
t0) NominalDiffTime -> NominalDiffTime -> Bool
forall a. Ord a => a -> a -> Bool
< NominalDiffTime
0.5 -> IO (FilePath, Text)
awaitEvent1
Maybe (Text, UTCTime)
_ -> do
IORef (Map FilePath (Text, UTCTime))
-> Map FilePath (Text, UTCTime) -> IO ()
forall a. IORef a -> a -> IO ()
writeIORef IORef (Map FilePath (Text, UTCTime))
previousFilesRef (Map FilePath (Text, UTCTime) -> IO ())
-> Map FilePath (Text, UTCTime) -> IO ()
forall a b. (a -> b) -> a -> b
$! FilePath
-> (Text, UTCTime)
-> Map FilePath (Text, UTCTime)
-> Map FilePath (Text, UTCTime)
forall k a. Ord k => k -> a -> Map k a -> Map k a
Map.insert FilePath
file (Text
contents, UTCTime
t) Map FilePath (Text, UTCTime)
previousFiles
(FilePath, Text) -> IO (FilePath, Text)
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (FilePath
file, Text
contents)
let awaitEvent2 :: IO (FilePath, Text)
awaitEvent2 :: IO (FilePath, Text)
awaitEvent2 = do
[(FilePath, UTCTime)]
_ <- STM [(FilePath, UTCTime)] -> IO [(FilePath, UTCTime)]
forall a. STM a -> IO a
STM.atomically (TQueue (FilePath, UTCTime) -> STM [(FilePath, UTCTime)]
forall a. TQueue a -> STM [a]
STM.flushTQueue TQueue (FilePath, UTCTime)
eventQueue)
IO (FilePath, Text)
awaitEvent1
IO (FilePath, Text) -> IO (IO (FilePath, Text))
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure IO (FilePath, Text)
awaitEvent2
forkDirWatcherThread :: Ki.Scope -> FSNotify.WatchManager -> FilePath -> (FilePath -> Bool) -> IO (STM.TQueue (FilePath, UTCTime))
forkDirWatcherThread :: Scope
-> WatchManager
-> FilePath
-> (FilePath -> Bool)
-> IO (TQueue (FilePath, UTCTime))
forkDirWatcherThread Scope
scope WatchManager
mgr FilePath
dir FilePath -> Bool
allow = do
TQueue (FilePath, UTCTime)
queue <- IO (TQueue (FilePath, UTCTime))
forall a. IO (TQueue a)
STM.newTQueueIO
let handler :: Event -> IO ()
handler :: Event -> IO ()
handler = \case
Added FilePath
fp UTCTime
t EventIsDirectory
FSNotify.IsFile | FilePath -> Bool
allow FilePath
fp -> STM () -> IO ()
forall (m :: * -> *) a. MonadIO m => STM a -> m a
atomically (TQueue (FilePath, UTCTime) -> (FilePath, UTCTime) -> STM ()
forall a. TQueue a -> a -> STM ()
STM.writeTQueue TQueue (FilePath, UTCTime)
queue (FilePath
fp, UTCTime
t))
Modified FilePath
fp UTCTime
t EventIsDirectory
FSNotify.IsFile | FilePath -> Bool
allow FilePath
fp -> STM () -> IO ()
forall (m :: * -> *) a. MonadIO m => STM a -> m a
atomically (TQueue (FilePath, UTCTime) -> (FilePath, UTCTime) -> STM ()
forall a. TQueue a -> a -> STM ()
STM.writeTQueue TQueue (FilePath, UTCTime)
queue (FilePath
fp, UTCTime
t))
Event
_ -> () -> IO ()
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
Scope -> ThreadOptions -> IO Void -> IO ()
Ki.forkWith_ Scope
scope ThreadOptions
Ki.defaultThreadOptions {Ki.maskingState = MaskedUninterruptible} do
IO ()
stopListening <- IO (IO ()) -> IO (IO ())
forall a. IO a -> IO a
unsafeUnmask (WatchManager
-> FilePath -> ActionPredicate -> (Event -> IO ()) -> IO (IO ())
FSNotify.watchDir WatchManager
mgr FilePath
dir (Bool -> ActionPredicate
forall a b. a -> b -> a
const Bool
True) Event -> IO ()
handler) IO (IO ()) -> IO (IO ()) -> IO (IO ())
forall a. IO a -> IO a -> IO a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> IO () -> IO (IO ())
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (() -> IO ()
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ())
IO Void -> IO Void
forall a. IO a -> IO a
unsafeUnmask (IO () -> IO Void
forall (f :: * -> *) a b. Applicative f => f a -> f b
forever (Int -> IO ()
threadDelay Int
forall a. Bounded a => a
maxBound)) IO Void -> IO () -> IO Void
forall (m :: * -> *) a b. MonadUnliftIO m => m a -> m b -> m a
`finally` IO ()
stopListening
TQueue (FilePath, UTCTime) -> IO (TQueue (FilePath, UTCTime))
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure TQueue (FilePath, UTCTime)
queue