module Language.PureScript.Publish.Utils where

import Prelude

import System.Directory (getCurrentDirectory)
import System.FilePath.Glob (Pattern, compile, globDir1)

-- | Glob relative to the current directory, and produce relative pathnames.

globRelative :: Pattern -> IO [FilePath]
globRelative :: Pattern -> IO [FilePath]
globRelative Pattern
pat = IO FilePath
getCurrentDirectory forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= Pattern -> FilePath -> IO [FilePath]
globDir1 Pattern
pat

-- | Glob pattern for PureScript source files.

purescriptSourceFiles :: Pattern
purescriptSourceFiles :: Pattern
purescriptSourceFiles = FilePath -> Pattern
compile FilePath
"src/**/*.purs"