-- |
-- License: GPL-3.0-or-later
-- Copyright: Oleg Grenrus
{-# LANGUAGE OverloadedStrings #-}
module CabalFmt.Fields.SourceFiles (
    sourceFilesF,
    fileFields,
    ) where

-- Make sure we explicitly use Posix's splitDirectories
-- when parsing glob syntax since only `/` is valid, and not '\\'
import qualified System.FilePath.Posix     as Posix (splitDirectories)

import qualified Distribution.FieldGrammar as C
import qualified Distribution.Fields       as C
import qualified Distribution.Parsec       as C
import qualified Distribution.Pretty       as C
import qualified Text.PrettyPrint          as PP

import CabalFmt.Fields
import CabalFmt.Prelude

sourceFilesF :: [FieldDescrs () ()]
sourceFilesF :: [FieldDescrs () ()]
sourceFilesF =
    [ forall f s a.
FieldName
-> (f -> Doc)
-> (forall (m :: * -> *). CabalParsing m => m f)
-> FieldDescrs s a
singletonF FieldName
f [FilePath] -> Doc
pretty forall (m :: * -> *). CabalParsing m => m [FilePath]
parse
    | FieldName
f <- [FieldName]
fileFields
    ]

fileFields :: [C.FieldName]
fileFields :: [FieldName]
fileFields =
    [ FieldName
"extra-source-files"
    , FieldName
"extra-doc-files"
    , FieldName
"data-files"
    , FieldName
"license-files"
    , FieldName
"asm-sources"
    , FieldName
"cmm-sources"
    , FieldName
"c-sources"
    , FieldName
"cxx-sources"
    , FieldName
"js-sources"
    , FieldName
"includes"
    , FieldName
"install-includes"
    ]

parse :: C.CabalParsing m => m [FilePath]
parse :: forall (m :: * -> *). CabalParsing m => m [FilePath]
parse = forall o n. Newtype o n => (o -> n) -> n -> o
unpack' (forall sep a b. sep -> (a -> b) -> [a] -> List sep b a
C.alaList' VCat
C.VCat FilePath -> FilePathNT
C.FilePathNT) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a (m :: * -> *). (Parsec a, CabalParsing m) => m a
C.parsec

pretty :: [FilePath] -> PP.Doc
pretty :: [FilePath] -> Doc
pretty
    = [Doc] -> Doc
PP.vcat forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b. (a -> b) -> [a] -> [b]
map FilePath -> Doc
C.showFilePath
    forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Eq a => [a] -> [a]
nub
    forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. (a -> a -> Ordering) -> [a] -> [a]
sortBy (forall {a}. Ord a => [a] -> [a] -> Ordering
cmp forall b c a. (b -> b -> c) -> (a -> b) -> a -> a -> c
`on` forall a b. (a -> b) -> [a] -> [b]
map FilePath -> FilePath
strToLower forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> [FilePath]
Posix.splitDirectories)
  where
    cmp :: [a] -> [a] -> Ordering
cmp [a]
a [a]
b = case forall a. Eq a => [a] -> [a] -> ([a], [a])
dropCommonPrefix [a]
a [a]
b of
        ([], [])  -> Ordering
EQ
        ([], a
_:[a]
_) -> Ordering
LT
        (a
_:[a]
_, []) -> Ordering
GT
        ([a]
a', [a]
b')  -> forall a. Ord a => a -> a -> Ordering
compare [a]
a' [a]
b'

strToLower :: String -> String
strToLower :: FilePath -> FilePath
strToLower = forall a b. (a -> b) -> [a] -> [b]
map Char -> Char
toLower

dropCommonPrefix :: Eq a => [a] -> [a] -> ([a], [a])
dropCommonPrefix :: forall a. Eq a => [a] -> [a] -> ([a], [a])
dropCommonPrefix [] [] = ([], [])
dropCommonPrefix [] [a]
ys = ([], [a]
ys)
dropCommonPrefix [a]
xs [] = ([a]
xs, [])
dropCommonPrefix xs :: [a]
xs@(a
x:[a]
xs') ys :: [a]
ys@(a
y:[a]
ys')
    | a
x forall a. Eq a => a -> a -> Bool
== a
y    = forall a. Eq a => [a] -> [a] -> ([a], [a])
dropCommonPrefix [a]
xs' [a]
ys'
    | Bool
otherwise = ([a]
xs, [a]
ys)