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
db = RunewordDB (fromList | |
[ ( ["ber", "tir", "um", "mal", "lum"] | |
, Runeword | |
{ name = "Beast" | |
, item = "scepter" | |
, description = | |
[ "fanaticism 9 when quipped" | |
, "+40% ias" | |
, "+240-270% dmg" | |
, "20% crushing blow" |
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 Kernel | |
# Ook, ook, ook! | |
def custom_init &block | |
self.new.instance_eval do | |
block.call self | |
self | |
end |
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 SchemeParser where | |
import Control.Applicative | |
import Text.ParserCombinators.Parsec hiding ((<|>)) | |
data Ast = Term String | List [Ast] | |
deriving 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 TemplateHaskell #-} | |
import Data.Lens.Template | |
import qualified Data.Map as Map | |
import Data.Map (Map) | |
import System.Random | |
import StatefulLens |
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
*.out | |
*.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
#pragma once | |
#include <cmath> | |
#include <iostream> | |
using namespace std; | |
static constexpr int pow(int x, int 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
module Behaviour where | |
import Prelude hiding (id, (.), head, tail, zip, unzip, map, repeat, cycle) | |
import Control.Applicative | |
import Control.Arrow | |
import Control.Category | |
import Data.Stream |
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 Arrows, TypeOperators #-} | |
import Prelude hiding (id, (.)) | |
import SF | |
-- this is the timer - returns length of the tick | |
ticks :: () :-> Double | |
ticks = constant 1 | |
-- Modelling the physics. |
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 | |
TemplateHaskell, | |
Arrows | |
#-} | |
module Thing where | |
import Prelude hiding (id, (.)) | |
import Control.Arrow |
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 #-} | |
type List a = | |
forall b. | |
(a -> b -> b) -> (b -> b) | |
nil :: List a | |
nil _ a = a | |
infixr 5 >< |