This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE DataKinds #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE PolyKinds #-} | |
{-# LANGUAGE UndecidableInstances #-} | |
{-# LANGUAGE TypeOperators #-} | |
{-# OPTIONS_GHC -Wall -Wno-missing-methods #-} | |
module HasNat where |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
[..] | |
data CPUState waitCycles | |
= Idle | |
| Waiting (Index waitCycles) | |
deriving (Generic, NFData, Show) | |
[..] |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
[..] | |
data CPUState waitCycles | |
= Idle | |
| Waiting (Index waitCycles) | |
deriving (Generic, NFData, Show) | |
[..] | |
cpu |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Pipeline where | |
import Clash.Prelude | |
(<@>) | |
:: ( HiddenClockResetEnable dom | |
, Undefined b | |
, Default b | |
) | |
=> (a -> b) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE DeriveGeneric #-} | |
{-# LANGUAGE DeriveAnyClass #-} | |
module CPU where | |
import Clash.Prelude | |
import Data.Maybe (isJust) | |
import Control.DeepSeq (NFData) | |
import GHC.Generics (Generic) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
src/Clash/Primitives/Intel/Fourteennm.hs:419:43: error: | |
• Expected kind ‘k1 -> *’, but ‘Reset clk’ has kind ‘*’ | |
• In the second argument of ‘(:::)’, namely ‘Reset clk synchronous’ | |
In the type signature: | |
fourteennm_mac# :: forall ax | |
ay_scan_in | |
az | |
bx | |
by | |
bz |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
[ { "BlackBox" : | |
{ "name" : "BlockRamHack.blockRam1#" | |
, "type" : | |
"blockRam# | |
:: HasCallStack -- ARG[0] | |
=> Clock dom gated -- clk, ARG[1] | |
-> Vec n a -- init hack ARG[2] | |
-> a -- init, ARG[3] | |
-> Signal dom Int -- rd, ARG[4] | |
-> Signal dom Bool -- wren, ARG[5] |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
data Person = Person | |
{ firstName :: !String | |
-- ^ First name | |
, lastName :: !String | |
-- ^ Last name | |
, age :: !Int | |
-- ^ Age | |
} deriving (Eq, Show) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE RankNTypes #-} | |
{-# LANGUAGE GADTs #-} | |
{-# LANGUAGE DataKinds #-} | |
{-# LANGUAGE TypeApplications #-} | |
{-# LANGUAGE KindSignatures #-} | |
{-# LANGUAGE ScopedTypeVariables #-} | |
{-# LANGUAGE AllowAmbiguousTypes #-} | |
module Lib where |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
Up to date | |
Loading dependencies took 0.742528095s | |
Parsing and compiling primitives took 0.067847811s | |
Compiling: MAC.topEntity | |
Ignoring .manifest files | |
MAC.topEntity8214565720323808422 before normalization: | |
λ(clk :: Clash.Signal.Internal.Clock | |
(Clash.Signal.Internal.Dom A 5000) | |
Clash.Signal.Internal.Source) -> |