Navigation Menu

Skip to content

Instantly share code, notes, and snippets.

View mizunashi-mana's full-sized avatar
💭
I may be slow to respond.

Mizunashi Mana mizunashi-mana

💭
I may be slow to respond.
View GitHub Profile

現状の問題点

依存関係

kifu-for-js
  - json-kifu-format
    - shogi.js
@mizunashi-mana
mizunashi-mana / fantasy-land.d.ts
Created May 11, 2016 17:50
fantasy-land typescript definition
interface Eq<T> {
equals(t: T): boolean;
}

Nested Unordered List Example

For gitbook bug report:

  • Item 1

    Item 1 text
    
Pillow==3.3.1
module Works.TestParsec where
import Text.Parsec hiding (optional)
import Text.Parsec.String
import Control.Applicative (optional)
data Command = Command
{ address :: Maybe Address
, cmdName :: Char
ed :: [String] -> IO ()
ed args = if null args
then do
x <- fromMaybe "" <$> runInputT defaultSettings (getInputLine "")
ed' (setCmd x) [] [] 1 True
else do
x <- createBuffer (head args)
y <- fromMaybe "" <$> runInputT defaultSettings (getInputLine "")
ed' (setCmd y) (head args) x 1 True
import Control.Applicative
import qualified Text.Parsec as P
import Text.Parsec.String
data Command = Command
{ addr :: Maybe Addr
, cmdName :: Char
, param :: Maybe String
} deriving (Show, Eq)
@mizunashi-mana
mizunashi-mana / Extra.hs
Last active November 10, 2017 13:06
Control.Concurrent.Async.Extra
{-# LANGUAGE ImplicitPrelude #-}
module Control.Concurrent.Async.Extra where
import Control.Concurrent.Async
import Control.Monad.Trans.Except
import Data.Foldable
concurrentlyExcept :: IO (Except e a) -> IO (Except e b) -> IO (Except e (a, b))
concurrentlyExcept actA actB = do
@mizunashi-mana
mizunashi-mana / DeferIsPrime.hs
Created February 11, 2018 08:54
IsPrimeを遅延させる
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE ConstraintKinds #-}
{-# LANGUAGE UndecidableInstances #-}
module Data.DeferIsPrime where
@mizunashi-mana
mizunashi-mana / sum_prop.coq
Created February 25, 2018 13:51
なんかできた
Require Import Arith.
Fixpoint sum (n: nat) {struct n}: nat :=
match n with
| O => O
| S p => S p + sum p
end.
Lemma sum_Sn: forall n, sum (S n) = S n + sum n.
Proof.