uniform-watch-0.1.5.1: uniform wrapper for watch
Safe HaskellSafe-Inferred
LanguageHaskell2010

Uniform.Watch

Description

a miniaml set of

Synopsis

Documentation

newtype Glob Source #

Constructors

Glob Text 

Instances

Instances details
Generic Glob Source # 
Instance details

Defined in Uniform.Watch

Associated Types

type Rep Glob :: Type -> Type #

Methods

from :: Glob -> Rep Glob x #

to :: Rep Glob x -> Glob #

Read Glob Source # 
Instance details

Defined in Uniform.Watch

Show Glob Source # 
Instance details

Defined in Uniform.Watch

Methods

showsPrec :: Int -> Glob -> ShowS #

show :: Glob -> String #

showList :: [Glob] -> ShowS #

Eq Glob Source # 
Instance details

Defined in Uniform.Watch

Methods

(==) :: Glob -> Glob -> Bool #

(/=) :: Glob -> Glob -> Bool #

type Rep Glob Source # 
Instance details

Defined in Uniform.Watch

type Rep Glob = D1 ('MetaData "Glob" "Uniform.Watch" "uniform-watch-0.1.5.1-GyQDpdKvlDN5laBTDzrceD" 'True) (C1 ('MetaCons "Glob" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

makeWatch :: a -> b -> c -> (a, b, c) Source #

startWatch2 :: (Show [Text], Show (Path Abs Dir)) => WatchOpType -> ErrIO () Source #

start watching for a set of files (glob patterns) in one directory essentially producing lines in the minimal twitch example with a single operation

runErrorRepl :: Show a => a -> IO () Source #

forkIO :: IO () -> IO ThreadId #

Creates a new thread to run the IO computation passed as the first argument, and returns the ThreadId of the newly created thread.

The new thread will be a lightweight, unbound thread. Foreign calls made by this thread are not guaranteed to be made by any particular OS thread; if you need foreign calls to be made by a particular OS thread, then use forkOS instead.

The new thread inherits the masked state of the parent (see mask).

The newly created thread has an exception handler that discards the exceptions BlockedIndefinitelyOnMVar, BlockedIndefinitelyOnSTM, and ThreadKilled, and passes all other exceptions to the uncaught exception handler.

killThread :: ThreadId -> IO () #

killThread raises the ThreadKilled exception in the given thread (GHC only).

killThread tid = throwTo tid ThreadKilled