aboutsummaryrefslogtreecommitdiffstats
path: root/src/Verismith/Tool/Icarus.hs
blob: 8504640e6acc4a95686299c889c19157f8b92672 (plain)
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
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
-- |
-- Module      : Verismith.Tool.Icarus
-- Description : Icarus verilog module.
-- Copyright   : (c) 2018-2019, Yann Herklotz
-- License     : GPL-3
-- Maintainer  : yann [at] yannherklotz [dot] com
-- Stability   : experimental
-- Portability : POSIX
--
-- Icarus verilog module.
module Verismith.Tool.Icarus
  ( Icarus (..),
    defaultIcarus,
    runSimIc,
    runSimIcEC,
  )
where

import Control.DeepSeq (NFData, rnf, rwhnf)
import Control.Lens
import Control.Monad (void)
import Crypto.Hash (Digest, hash)
import Crypto.Hash.Algorithms (SHA256)
import Data.Binary (encode)
import Data.Bits
import qualified Data.ByteArray as BA (convert)
import Data.ByteString (ByteString)
import qualified Data.ByteString as B
import Data.ByteString.Lazy (toStrict)
import qualified Data.ByteString.Lazy as L (ByteString)
import Data.Char (digitToInt)
import Data.Foldable (fold)
import Data.List (transpose)
import Data.Maybe (listToMaybe)
import Data.Text (Text)
import qualified Data.Text as T
import Numeric (readInt)
import Shelly
import Shelly.Lifted (liftSh)
import Verismith.CounterEg (CounterEg (..))
import Verismith.Result
import Verismith.Tool.Internal
import Verismith.Tool.Template
import Verismith.Verilog.AST
import Verismith.Verilog.BitVec
import Verismith.Verilog.CodeGen
import Verismith.Verilog.Internal
import Verismith.Verilog.Mutate
import Prelude hiding (FilePath)

data Icarus
  = Icarus
      { icarusPath :: FilePath,
        vvpPath :: FilePath
      }
  deriving (Eq)

instance Show Icarus where
  show _ = "iverilog"

instance Tool Icarus where
  toText _ = "iverilog"

instance Simulator Icarus where
  runSim = runSimIcarus
  runSimWithFile = runSimIcarusWithFile

instance NFData Icarus where
  rnf = rwhnf

defaultIcarus :: Icarus
defaultIcarus = Icarus "iverilog" "vvp"

addDisplay :: [Statement ann] -> [Statement ann]
addDisplay s =
  concat $
    transpose
      [ s,
        replicate l $ TimeCtrl 1 Nothing,
        replicate l . SysTaskEnable $ Task "display" ["%b", Id "y"]
      ]
  where
    l = length s

assignFunc :: [Port] -> ByteString -> Statement ann
assignFunc inp bs =
  NonBlockAssign
    . Assign conc Nothing
    . Number
    . BitVec (B.length bs * 8)
    $ bsToI bs
  where
    conc = RegConcat (portToExpr <$> inp)

convert :: Text -> ByteString
convert =
  toStrict
    . (encode :: Integer -> L.ByteString)
    . maybe 0 fst
    . listToMaybe
    . readInt 2 (`elem` ("01" :: String)) digitToInt
    . T.unpack

mask :: Text -> Text
mask = T.replace "x" "0"

callback :: ByteString -> Text -> ByteString
callback b t = b <> convert (mask t)

runSimIcarus :: Show ann => Icarus -> (SourceInfo ann) -> [ByteString] -> ResultSh ByteString
runSimIcarus sim rinfo bss = do
  let tb =
        ModDecl
          "main"
          []
          []
          [ Initial $
              fold (addDisplay $ assignFunc (_modInPorts m) <$> bss)
                <> (SysTaskEnable $ Task "finish" [])
          ]
          []
  let newtb = instantiateMod m tb
  let modWithTb = Verilog [newtb, m]
  liftSh . writefile "main.v" $ genSource modWithTb
  annotate (SimFail mempty) $ runSimWithFile sim "main.v" bss
  where
    m = rinfo ^. mainModule

runSimIcarusWithFile ::
  Icarus -> FilePath -> [ByteString] -> ResultSh ByteString
runSimIcarusWithFile sim f _ = annotate (SimFail mempty) . liftSh $ do
  dir <- pwd
  logCommand_ dir "icarus" $
    run (icarusPath sim) ["-o", "main", toTextIgnore f]
  B.take 8 . BA.convert . (hash :: ByteString -> Digest SHA256)
    <$> logCommand
      dir
      "vvp"
      (runFoldLines (mempty :: ByteString) callback (vvpPath sim) ["main"])

fromBytes :: ByteString -> Integer
fromBytes = B.foldl' f 0 where f a b = a `shiftL` 8 .|. fromIntegral b

tbModule :: [ByteString] -> (ModDecl ann) -> (Verilog ann)
tbModule bss top =
  Verilog
    [ instantiateMod top $
        ModDecl
          "testbench"
          []
          []
          [ Initial $
              fold
                [ BlockAssign (Assign "clk" Nothing 0),
                  BlockAssign (Assign inConcat Nothing 0)
                ]
                <> fold
                  ( ( \r ->
                        TimeCtrl
                          10
                          (Just $ BlockAssign (Assign inConcat Nothing r))
                    )
                      . fromInteger
                      . fromBytes <$> bss
                  )
                <> (TimeCtrl 10 . Just . SysTaskEnable $ Task "finish" []),
            Always . TimeCtrl 5 . Just $
              BlockAssign
                (Assign "clk" Nothing (UnOp UnNot (Id "clk"))),
            Always . EventCtrl (EPosEdge "clk") . Just . SysTaskEnable $
              Task "strobe" ["%b", Id "y"]
          ]
          []
    ]
  where
    inConcat = (RegConcat . filter (/= (Id "clk")) $ (Id . fromPort <$> (top ^. modInPorts)))

counterTestBench :: CounterEg -> (ModDecl ann) -> (Verilog ann)
counterTestBench (CounterEg _ states) m = tbModule filtered m
  where
    filtered = convert . fold . fmap snd . filter ((/= "clk") . fst) <$> states

runSimIc' ::
  (Synthesiser b, Show ann) =>
  ([ByteString] -> (ModDecl ann) -> (Verilog ann)) ->
  FilePath ->
  Icarus ->
  b ->
  (SourceInfo ann) ->
  [ByteString] ->
  Maybe ByteString ->
  ResultSh ByteString
runSimIc' fun datadir sim1 synth1 srcInfo bss bs = do
  dir <- liftSh pwd
  let top = srcInfo ^. mainModule
  let tb = fun bss top
  liftSh . writefile tbname $ icarusTestbench datadir tb synth1
  liftSh $ exe dir "icarus" "iverilog" ["-o", exename, toTextIgnore tbname]
  s <-
    liftSh $
      B.take 8
        . BA.convert
        . (hash :: ByteString -> Digest SHA256)
        <$> logCommand
          dir
          "vvp"
          ( runFoldLines
              (mempty :: ByteString)
              callback
              (vvpPath sim1)
              [exename]
          )
  case (bs, s) of
    (Nothing, s') -> ResultT . return $ Pass s'
    (Just bs', s') ->
      if bs' == s'
        then ResultT . return $ Pass s'
        else ResultT . return $ Fail (SimFail s')
  where
    exe dir name e = void . errExit False . logCommand dir name . timeout e
    tbname = fromText $ toText synth1 <> "_testbench.v"
    exename = toText synth1 <> "_main"

runSimIc ::
  (Synthesiser b, Show ann) =>
  -- | Data directory.
  FilePath ->
  -- | Icarus simulator.
  Icarus ->
  -- | Synthesis tool to be tested.
  b ->
  -- | Original generated program to test.
  (SourceInfo ann) ->
  -- | Test vectors to be passed as inputs to the generated Verilog.
  [ByteString] ->
  -- | What the correct output should be. If
  -- 'Nothing' is passed, then just return 'Pass
  -- ByteString' with the answer.
  Maybe ByteString ->
  ResultSh ByteString
runSimIc = runSimIc' tbModule

runSimIcEC ::
  (Synthesiser b, Show ann) =>
  FilePath ->
  Icarus ->
  b ->
  (SourceInfo ann) ->
  CounterEg ->
  Maybe ByteString ->
  ResultSh ByteString
runSimIcEC a b c d e = runSimIc' (const $ counterTestBench e) a b c d []