about summary refs log tree commit diff
path: root/users/Profpatsch/nixpkgs-rewriter/MetaStdenvLib.hs
blob: 3ed96a7b6eac700de1caba32b8aff8a4708a08a6 (plain) (blame)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
{-# LANGUAGE PartialTypeSignatures #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE NamedFieldPuns #-}
import Nix.Parser
import Nix.Expr.Types
import Nix.Expr.Types.Annotated
import System.Environment (getArgs)
import System.Exit (die)
import Data.Fix (Fix(..))
import qualified Data.Text as Text
import qualified Data.ByteString.Lazy.Char8 as BL
import qualified Data.Aeson as A
import qualified Data.Aeson.Encoding as A
import Data.Function ((&))
import qualified System.IO as IO
import qualified Text.Megaparsec.Pos as MP

main = do
  (nixFile:_) <- getArgs
  (parseNixFileLoc nixFile :: IO _) >>= \case
    Failure err -> do
      ePutStrLn $ show err
      die "oh no"
    Success expr -> do
      case snd $ match expr of
        NoArguments -> do
          ePutStrLn $ "NoArguments in " <> nixFile
          printPairs mempty
        YesLib vars -> do
          ePutStrLn $ "lib in " <> show vars <> " in " <> nixFile
          printPairs mempty
        NoLib vars srcSpan -> do
          ePutStrLn $ nixFile <> " needs lib added"
          printPairs
            $ "fileName" A..= nixFile
            <> "fromLine" A..= (srcSpan & spanBegin & sourceLine)
            <> "fromColumn" A..= (srcSpan & spanBegin & sourceColumn)
            <> "toLine" A..= (srcSpan & spanEnd & sourceLine)
            <> "toColumn" A..= (srcSpan & spanEnd & sourceColumn)

printPairs pairs = BL.putStrLn $ A.encodingToLazyByteString $ A.pairs pairs

ePutStrLn = IO.hPutStrLn IO.stderr

data Descend = YesDesc | NoDesc
  deriving Show
data Matched =  NoArguments | NoLib [VarName] SrcSpan | YesLib [VarName]
  deriving Show

match :: Fix (Compose (Ann SrcSpan) NExprF) -> (Descend, Matched)
match = \case
  (AnnE outerSpan (NAbs (ParamSet params _ _) (AnnE innerSpan _))) -> (NoDesc,
    let vars = map fst params in
    case (any (== "lib") vars) of
      True -> YesLib vars
      False ->
          -- The span of the arglist is from the beginning of the match
          -- to the beginning of the inner expression
          let varSpan = SrcSpan
                { spanBegin = outerSpan & spanBegin
                -- -1 to prevent the spans from overlapping
                , spanEnd = sourcePosMinus1 (innerSpan & spanBegin) }
          in NoLib vars varSpan)
  _ -> (NoDesc, NoArguments)

-- | Remove one from a source positon.
--
-- That means if the current position is at the very beginning of a line,
-- jump to the previous line.
sourcePosMinus1 :: SourcePos -> SourcePos
sourcePosMinus1 src@(SourcePos { sourceLine, sourceColumn }) =
  let
    col = MP.mkPos $ max (MP.unPos sourceColumn - 1) 1
    line = MP.mkPos $ case MP.unPos sourceColumn of
      1 -> max (MP.unPos sourceLine - 1) 1
      _ -> MP.unPos sourceLine
  in src
    { sourceLine = line
    , sourceColumn = col }