hnix/tests/EvalTests.hs

200 lines
5.6 KiB
Haskell
Raw Normal View History

{-# LANGUAGE FlexibleContexts #-}
2015-12-21 06:55:53 +01:00
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE UndecidableInstances #-}
{-# OPTIONS_GHC -Wno-missing-signatures -Wno-orphans #-}
2018-04-08 09:26:48 +02:00
module EvalTests (tests, genEvalCompareTests) where
2015-12-21 06:55:53 +01:00
import Control.Monad (when)
import Control.Monad.IO.Class
import qualified Data.HashMap.Lazy as M
import Data.Maybe (isJust)
2018-04-10 21:38:14 +02:00
import Data.String.Interpolate.IsString
import Data.Text (Text)
2018-05-03 06:32:00 +02:00
import Data.Time
2018-04-10 21:38:14 +02:00
import Nix
2018-04-08 09:26:48 +02:00
import qualified System.Directory as D
import System.Environment
2018-04-10 21:38:14 +02:00
import System.FilePath
import Test.Tasty
import Test.Tasty.HUnit
import Test.Tasty.TH
import TestCommon
2015-12-21 06:55:53 +01:00
case_basic_sum =
constantEqualText "2" "1 + 1"
2018-04-28 23:23:50 +02:00
case_basic_div =
constantEqualText "3" "builtins.div 6 2"
case_basic_function =
constantEqualText "2" "(a: a) 2"
2015-12-21 06:55:53 +01:00
case_set_attr =
constantEqualText "2" "{ a = 2; }.a"
2015-12-21 06:55:53 +01:00
case_function_set_arg =
constantEqualText "2" "({ a }: 2) { a = 1; }"
2015-12-21 06:55:53 +01:00
case_function_set_two_arg =
constantEqualText "2" "({ a, b ? 3 }: b - a) { a = 1; }"
2015-12-21 06:55:53 +01:00
case_function_set_two_arg_default_scope =
constantEqualText "2" "({ x ? 1, y ? x * 3 }: y - x) {}"
2015-12-21 06:55:53 +01:00
case_function_default_env =
constantEqualText "2" "let default = 2; in ({ a ? default }: a) {}"
2018-01-28 16:54:59 +01:00
case_function_definition_uses_environment =
constantEqualText "3" "let f = (let a=1; in x: x+a); in f 2"
2018-01-28 16:54:59 +01:00
case_function_atpattern =
-- jww (2018-05-09): This should be constantEqualText
constantEqualText' "2" "(({a}@attrs:attrs) {a=2;}).a"
2018-01-28 16:54:59 +01:00
case_function_ellipsis =
-- jww (2018-05-09): This should be constantEqualText
constantEqualText' "2" "(({a, ...}@attrs:attrs) {a=0; b=2;}).b"
2015-12-21 06:55:53 +01:00
case_function_default_value_not_in_atpattern =
constantEqualText "false" "({a ? 2}@attrs: attrs ? a) {}"
2018-04-03 23:43:40 +02:00
case_function_arg_shadowing =
constantEqualText "6" "(y: y: x: x: x + y) 1 2 3 4"
2018-04-03 23:43:40 +02:00
case_function_recursive_args =
constantEqualText "2" "({ x ? 1, y ? x * 3}: y - x) {}"
case_function_recursive_sets =
constantEqualText "[ [ 6 4 100 ] 4 ]" [i|
let x = rec {
y = 2;
z = { w = 4; };
v = rec {
u = 6;
t = [ u z.w s ];
};
}; s = 100; in [ x.v.t x.z.w ]
|]
case_nested_with =
constantEqualText "2" "with { x = 1; }; with { x = 2; }; x"
case_match_failure_null =
constantEqualText "null" "builtins.match \"ab\" \"abc\""
case_inherit_in_rec_set =
constantEqualText "1" "let x = 1; in (rec { inherit x; }).x"
case_lang_version =
constantEqualText "5" "builtins.langVersion"
case_rec_set_attr_path_simpl =
constantEqualText "123" [i|
let x = rec {
foo.number = 123;
foo.function = y: foo.number;
}; in x.foo.function 1
|]
case_inherit_from_set_has_no_scope =
constantEqualText' "false" [i|
(builtins.tryEval (
let x = 1;
y = { z = 2; };
in { inherit (y) x; }.x
)).success
|]
case_fixed_points =
constantEqualText [i|[
{
foobar = "foobar";
foo = "foo";
bar = "bar";
}
{
foobar = "foo + bar";
foo = "foo + ";
bar = "bar";
}
]|] [i|
let
fix = f: let x = f x; in x;
extends = f: rattrs: self:
let super = rattrs self; in super // f self super;
f = self: { foo = "foo";
bar = "bar";
foobar = self.foo + self.bar; };
g = self: super: { foo = super.foo + " + "; };
in [ (fix f) (fix (extends g f)) ]
|]
case_fixed_points_and_fold =
constantEqualText [i|[ {} {} ]|] [i|
let
extends = f: rattrs: self:
let super = rattrs self; in super // f self super;
flip = f: a: b: f b a;
toFixFold = builtins.foldl' (flip extends) (self: {}) ([(self: super: {})]);
toFix = extends (self: super: {}) (self: {});
fix = f: let x = f x; in x;
in [ (fix toFixFold) (fix toFix) ]
|]
2018-04-29 07:18:46 +02:00
-- jww (2018-05-02): This constantly changes!
-- case_placeholder =
-- constantEqualText
-- "\"/1rz4g4znpzjwh1xymhjpm42vipw92pr73vdgl6xs1hycac8kf2n9\""
-- "builtins.placeholder \"out\""
-----------------------
2018-03-28 03:42:31 +02:00
2015-12-21 06:55:53 +01:00
tests :: TestTree
tests = $testGroupGenerator
2018-04-08 09:26:48 +02:00
genEvalCompareTests = do
files <- filter ((==".nix") . takeExtension) <$> D.listDirectory testDir
2018-04-11 02:15:23 +02:00
return $ testGroup "Eval comparison tests" $ map mkTestCase files
2018-04-08 09:26:48 +02:00
where
testDir = "tests/eval-compare"
mkTestCase f = testCase f $ assertEvalFileMatchesNix (testDir </> f)
instance (Show r, Show (NValueF m r), Eq r) => Eq (NValueF m r) where
NVConstantF x == NVConstantF y = x == y
NVStrF x _ == NVStrF y _ = x == y
NVListF x == NVListF y = and (zipWith (==) x y)
NVSetF x _ == NVSetF y _ =
M.keys x == M.keys y &&
and (zipWith (==) (M.elems x) (M.elems y))
x == y = error $ "Need to add comparison for values: "
++ show x ++ " == " ++ show y
2015-12-21 06:55:53 +01:00
constantEqual :: NExprLoc -> NExprLoc -> Assertion
2015-12-21 06:55:53 +01:00
constantEqual a b = do
2018-05-03 06:32:00 +02:00
time <- liftIO getCurrentTime
let opts = defaultOptions time
-- putStrLn =<< lint (stripAnnotation a)
2018-05-03 06:32:00 +02:00
a' <- runLazyM opts $ normalForm =<< nixEvalExprLoc Nothing a
-- putStrLn =<< lint (stripAnnotation b)
2018-05-03 06:32:00 +02:00
b' <- runLazyM opts $ normalForm =<< nixEvalExprLoc Nothing b
2015-12-21 06:55:53 +01:00
assertEqual "" a' b'
constantEqualText' :: Text -> Text -> Assertion
constantEqualText' a b = do
let Success a' = parseNixTextLoc a
Success b' = parseNixTextLoc b
constantEqual a' b'
constantEqualText :: Text -> Text -> Assertion
constantEqualText a b = do
constantEqualText' a b
mres <- liftIO $ lookupEnv "MATCHING_TESTS"
when (isJust mres) $
assertEvalMatchesNix b