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 OverloadedStrings #-} | |
{-# LANGUAGE BlockArguments #-} | |
-- From: https://patchbay.pub | |
-- | |
-- Normal Usage: | |
-- Shell 1: curl localhost:9000/test1 | |
-- Shell 2: curl -s localhost:9000/test1 -X POST -T /dev/stdin | |
-- | |
-- Pub-Sub Usage: |
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
// http://journal.stuffwithstuff.com/2013/12/08/babys-first-garbage-collector/ | |
// | |
#define STACK_MAX 256 | |
#define INITIAL_GC_THRESHOLD 2 | |
#include <stdio.h> | |
#include <stdlib.h> | |
void gc(); // Pre-Declared for co-recursive usage |
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 BlockArguments #-} | |
module Main where | |
import Data.Char | |
import Data.List.Split | |
import qualified Data.Set | |
main :: IO () |
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
-- https://gist.github.com/sordina/ea8c66ddcc467f77b58b0af0b5628435 | |
module Lib ( main ) where | |
import Data.Tree | |
import Data.List | |
import System.Environment | |
type Capacity = Int | |
type Level = Int |
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
# https://en.wikipedia.org/wiki/APL_syntax_and_symbols | |
# https://code.jsoftware.com/wiki/NuVoc | |
# https://news.ycombinator.com/item?id=8605606 | |
# | |
# | |
# sub asterisk by multiply; | |
# Roll ?B | |
# Ceiling ⌈B >. | |
sub greater period by uni2308; |
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 Main where | |
main :: IO () | |
main = interact (unlines . map (go . read) . lines) | |
go :: Int -> String | |
go n = case term n | |
of [] -> "nothing" | |
[(x,"")] -> numb x | |
xs -> unwords $ map item xs |
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
defmodule Looksay do | |
def build([h|l]) do | |
n = l |> length |> Looksay.succ |> inspect | |
n <> h | |
end | |
def succ(x), do: x + 1 | |
def group([],x), do: [ x ] | |
def group([h|t],[]), do: group(t,[h]) |
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 UndecidableInstances #-} | |
{-# LANGUAGE DeriveFunctor #-} | |
module Main where | |
import Control.Arrow | |
import Data.Functor.Classes | |
data Fix f = In { out :: (f (Fix f)) } |
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 OverloadedStrings #-} | |
{-# LANGUAGE ApplicativeDo #-} | |
{-# LANGUAGE NoMonomorphismRestriction #-} | |
module Main where | |
import Data.String | |
import Data.Monoid hiding (Alt) | |
import Control.Applicative | |
import Control.Monad.Logic |
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 QuasiQuotes #-} | |
{-# LANGUAGE ScopedTypeVariables #-} | |
import Language.Haskell.Interpreter | |
import Text.InterpolatedString.Perl6 | |
import Control.Exception | |
import Control.Monad | |
import Data.Traversable | |
format :: Either InterpreterError Bool -> String |