This is a source code of BCMA's "Block Cloudflare MITM Attack".
PRs are welcome.
This add-on will block, notify, or redirect your request if the target website is using Cloudflare.
{-# LANGUAGE DataKinds #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE InstanceSigs #-} | |
{-# LANGUAGE KindSignatures #-} | |
{-# LANGUAGE PolyKinds #-} | |
{-# LANGUAGE Rank2Types #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE TypeOperators #-} | |
{-# LANGUAGE UndecidableInstances #-} |
{-# LANGUAGE | |
AllowAmbiguousTypes, | |
TypeApplications, | |
ScopedTypeVariables, | |
GADTs, | |
DataKinds, | |
PolyKinds, | |
FlexibleContexts, | |
FlexibleInstances, | |
MultiParamTypeClasses, |
The idea is to host haskell implementations of popular console/arcade titles as a blog series. The end goal being to ignite interest in writing games with haskell and possibly hosting a haskell game jam at some point in the future. For launch it would be nice to have 3-4 games already written.
Getting this off the ground is going to take a long time as my (schell's) free time is pretty limited ATM, so don't worry if you feel like committing to this is too much. You can commit any amount of time and write your game slowly as I figure out the details.
{-# LANGUAGE RankNTypes, GADTs #-} | |
module Mo where | |
import Control.Comonad | |
import Control.Comonad.Trans.Class | |
import Control.Monad | |
{- | |
The monad-to-comonad transformer. | |
Originally, Mo was defined as the simpler (and isomorphic): | |
data Mo m w a where |
{-# LANGUAGE AllowAmbiguousTypes #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE GeneralizedNewtypeDeriving #-} | |
{-# LANGUAGE DeriveGeneric #-} | |
{-# LANGUAGE ScopedTypeVariables #-} | |
{-# LANGUAGE StandaloneDeriving #-} | |
{-# LANGUAGE TypeApplications #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE TypeOperators #-} |
For the Trac ticket #14860
.
All these types are valid for h
, but its principal type involves -XQuantifiedConstraints
{-# Language FlexibleInstances, MultiParamTypeClasses, GADTs, QuantifiedConstraints #-}
import Data.Kind
type family FB (a::Type) (b::Type) :: Type where
This is a quick & dirty way to attach an Akai MPK mini 2 USB MIDI controller to Linux so the Linux machine can act as its synthesizer. This approach should work for any modern USB MIDI instrument.
I looked around on the web and, surprisingly, I didn't find any simple options for quickly starting Fluidsynth up and wiring it to a MIDI controller for simple keyboard usage. There are a few out there that involve using Qsynth which is cool but I didn't want a GUI for something relatively simple.
Title: Simple Sabotage Field Manual Author: Strategic Services Office of Strategic Services