module GHCup.Utils.Prelude.Posix where

import System.Directory
import System.Posix.Files


isWindows, isNotWindows :: Bool
isWindows :: Bool
isWindows = Bool
False
isNotWindows :: Bool
isNotWindows = Bool -> Bool
not Bool
isWindows


moveFile :: FilePath -> FilePath -> IO ()
moveFile :: FilePath -> FilePath -> IO ()
moveFile = FilePath -> FilePath -> IO ()
rename


moveFilePortable :: FilePath -> FilePath -> IO ()
moveFilePortable :: FilePath -> FilePath -> IO ()
moveFilePortable FilePath
from FilePath
to = do
  FilePath -> FilePath -> IO ()
copyFile FilePath
from FilePath
to
  FilePath -> IO ()
removeFile FilePath
from