The transpiler reads all of its input from the standard input. The eight first lines must contain the strings that represent each brainfuck instructions in the output, in this order:
<
>
+
-
{-# LANGUAGE CPP #-} | |
{-# LANGUAGE DataKinds #-} | |
{-# LANGUAGE DeriveDataTypeable #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE GADTs #-} | |
{-# LANGUAGE ScopedTypeVariables #-} | |
{-# LANGUAGE StandaloneDeriving #-} | |
{-# LANGUAGE TypeApplications #-} | |
{-# LANGUAGE TypeFamilies #-} |
{-# LANGUAGE AllowAmbiguousTypes #-} | |
{-# LANGUAGE InstanceSigs #-} | |
{-# LANGUAGE ScopedTypeVariables #-} | |
{-# LANGUAGE TypeApplications #-} | |
{-# LANGUAGE TypeFamilies #-} | |
module Foo where | |
import Control.Monad.Reader | |
import Data.Kind (Type) |
[alias] | |
st = status | |
ci = commit | |
co = checkout | |
br = branch | |
ff = merge --ff-only | |
fa = fetch --all | |
rh = reset --hard | |
cp = cherry-pick | |
d = diff --color |
#! /usr/bin/env runhaskell | |
{-# LANGUAGE Haskell2010 #-} | |
{-# LANGUAGE MultiParamTypeClasses #-} | |
{-# LANGUAGE RankNTypes #-} | |
import Control.Applicative | |
import Control.Lens | |
import Control.Monad | |
import Data.Tree |
-- {-# LANGUAGE Haskell2010 #-} | |
{-# LANGUAGE RankNTypes #-} | |
a :: m i | |
a = x y | |
x :: (i -> forall p. p f i) -> m i | |
x l = undefined | |
y :: i -> (forall p f. p f i) |
{-# LANGUAGE BlockArguments #-} | |
{-# LANGUAGE ImportQualifiedPost #-} | |
{-# LANGUAGE LambdaCase #-} | |
{-# LANGUAGE OverloadedStrings #-} | |
module Main where | |
import Data.Char | |
import Data.List (intercalate) | |
import Data.Map.Strict qualified as M |
{-# LANGUAGE TemplateHaskell #-} | |
import Control.Lens | |
import Control.Lens.TH | |
-------------------------------------------------------------------------------- | |
-- Characters | |
-- | |
-- Some of the fields are only relevant to some characters, but are |
{-# LANGUAGE UndecidableInstances #-} | |
import Control.Applicative (liftA2) | |
import Data.Dependent.Map qualified as D | |
import Data.Foldable (foldlM) | |
import Data.List (permutations) | |
import GHC.Generics | |
import Text.Parsec | |
import Text.Parsec.Char | |
import Text.Parsec.String |
<!DOCTYPE html> | |
<html> | |
<head> | |
<style> | |
table td { | |
vertical-align: baseline; | |
} | |
.left-column { | |
padding-top: 50px; | |
} |