"46010000224981"
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 DefaultSignatures, DataKinds, TypeFamilies, UndecidableInstances, | |
DerivingStrategies, DeriveAnyClass, TypeOperators, StandaloneKindSignatures #-} | |
module PreventAnyclassDeriving where | |
import GHC.TypeLits (TypeError, ErrorMessage (Text, ShowType, (:<>:))) | |
import Data.Kind (Type, Constraint) | |
type MkTypeError :: (Type -> Constraint) -> Type -> Type | |
type family MkTypeError c a where | |
MkTypeError c a = |
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 Plutarch.Eval (evalT, evalSerialize, evalWithArgsT, evalWithArgsT', x) where | |
import qualified Codec.CBOR.Write as Write | |
import Codec.Serialise (Serialise, encode) | |
import Data.Bifunctor (first) | |
import qualified Data.ByteString.Base16 as Base16 | |
import Data.Text (Text, pack) | |
import qualified Data.Text.Encoding as TE | |
import Plutarch (ClosedTerm, compile, defaultConfig) | |
import Plutarch.Evaluate (evalScript) |
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 TypeFamilies, GADTs, DataKinds, TypeOperators, DerivingStrategies, StandaloneDeriving #-} | |
module Nat () where | |
data Nat = Z | |
| S Nat | |
type family (+) m n where | |
Z + n = n | |
(S m) + n = S (m + n) |
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
> {-# OPTIONS_GHC -Wall #-} | |
> {-# LANGUAGE AllowAmbiguousTypes #-} | |
> {-# LANGUAGE DataKinds #-} | |
> {-# LANGUAGE DerivingStrategies #-} | |
> {-# LANGUAGE FlexibleInstances #-} | |
> {-# LANGUAGE FlexibleContexts #-} | |
> {-# LANGUAGE GADTs #-} | |
> {-# LANGUAGE FunctionalDependencies #-} | |
> {-# LANGUAGE PartialTypeSignatures #-} | |
> {-# LANGUAGE PolyKinds #-} |
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 ConstraintKinds #-} | |
{-# LANGUAGE ExplicitForAll #-} | |
{-# LANGUAGE ExtendedDefaultRules #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE OverloadedStrings #-} | |
{-# LANGUAGE TypeApplications #-} | |
module Loop where | |
import Control.Monad (replicateM_) |
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
{-# OPTIONS_GHC -Wno-orphans #-} | |
module Plutarch.Extra.Time ( | |
ptoInterval, | |
pafterInterval, | |
pcontainsInterval, | |
pupperBound, | |
plowerBound, | |
pfiniteUpperBound, | |
pfiniteUpperBoundData, |
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
\documentclass[a4paper,10pt]{article} | |
\usepackage[utf8]{inputenc} | |
\usepackage{amsmath} | |
\usepackage{amssymb} | |
\usepackage{amsthm} | |
\usepackage{tabularx} | |
\usepackage{hyphenat} | |
\usepackage{bbm} | |
\usepackage[german]{babel} | |
\newcommand{\R}{\mathbb{R}} |
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
{-# OPTIONS_GHC -Wall #-} | |
{-# LANGUAGE RankNTypes, DataKinds, TypeOperators, | |
GADTs, StandaloneKindSignatures, PolyKinds, TypeFamilies, | |
UndecidableInstances, StandaloneDeriving, DerivingStrategies, | |
MultiParamTypeClasses, FlexibleInstances, AllowAmbiguousTypes, | |
TypeApplications, ScopedTypeVariables, PartialTypeSignatures #-} | |
module HeterogeneousTrees where | |
import GHC.TypeLits (Symbol, TypeError, ErrorMessage (Text)) | |
import Data.Kind (Type) |
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
{ | |
inputs.nixpkgs-2111.url = "github:NixOS/nixpkgs/nixpkgs-21.11-darwin"; | |
} |
NewerOlder