module System.Directory.Machine.Internal where

-- | Predicate to filter out relative paths: @"."@ and @".."@.
isDirectoryContentsValid :: FilePath -> Bool
isDirectoryContentsValid :: FilePath -> Bool
isDirectoryContentsValid FilePath
x = (FilePath
x FilePath -> FilePath -> Bool
forall a. Eq a => a -> a -> Bool
/= FilePath
"." Bool -> Bool -> Bool
&& FilePath
x FilePath -> FilePath -> Bool
forall a. Eq a => a -> a -> Bool
/= FilePath
"..")