{-# LANGUAGE CPP #-}
{-# LANGUAGE ExistentialQuantification #-}
{-# LANGUAGE Safe #-}
module System.Path (
Path
, takeDirectory
, takeFileName
, FileExt(..)
, (<.>)
, (-<.>)
, splitExtension
, splitExtensions
, takeExtension
, takeExtensions
, takeBaseName
, stripExtension
, isExtensionOf
, hasTrailingPathSeparator
, addTrailingPathSeparator
, dropTrailingPathSeparator
, Unrooted
, (</>)
, unrootPath
, toUnrootedFilePath
, fromUnrootedFilePath
, fragment
, fragments
, joinFragments
, splitFragments
, normalise
, FsRoot(..)
, FsPath(..)
, CWD
, Relative
, Absolute
, HomeDir
, toFilePath
, fromFilePath
, makeAbsolute
, fromAbsoluteFilePath
) where
import System.Path.Internal