-- | The module of this name differs as between Windows and non-Windows builds.

-- This is the Windows version.

module System.Permissions
  ( osIsMacOS
  , osIsWindows
  , setFileExecutable
  , setScriptPerms
  ) where

-- | False if using Windows.

osIsMacOS :: Bool
osIsMacOS :: Bool
osIsMacOS = Bool
False

-- | True if using Windows.

osIsWindows :: Bool
osIsWindows :: Bool
osIsWindows = Bool
True

setFileExecutable :: Monad m => FilePath -> m ()
setFileExecutable :: forall (m :: * -> *). Monad m => FilePath -> m ()
setFileExecutable FilePath
_ = () -> m ()
forall a. a -> m a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()

setScriptPerms :: Monad m => FilePath -> m ()
setScriptPerms :: forall (m :: * -> *). Monad m => FilePath -> m ()
setScriptPerms FilePath
_ = () -> m ()
forall a. a -> m a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()