{-# LANGUAGE NoImplicitPrelude, Strict #-}
{-# OPTIONS_HADDOCK show-extensions #-}
module Rhythmicity.BasicF where
import Data.Bits
import GHC.Num
import GHC.Base
import GHC.Real
import GHC.List
import GHC.Int
import GHC.Enum (fromEnum)
hashPosLF2 :: Int8 -> [Integer] -> Integer
hashPosLF2 :: Int8 -> [Integer] -> Integer
hashPosLF2 Int8
i [Integer]
ns = forall a. Bits a => a -> Int -> a
shift (forall a. Num a => [a] -> a
sum [Integer]
ns) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
fromEnum forall a b. (a -> b) -> a -> b
$ Int8
i
{-# INLINE hashPosLF2 #-}
hashBalancingLF2 :: Int8 -> [Integer] -> Integer
hashBalancingLF2 :: Int8 -> [Integer] -> Integer
hashBalancingLF2 Int8
_ = forall a. Num a => [a] -> a
sum forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b c. (a -> b -> c) -> [a] -> [b] -> [c]
zipWith (\Int
pos Integer
n -> forall a. Bits a => a -> Int -> a
shiftR Integer
n (Int
20forall a. Num a => a -> a -> a
*Int
pos)) [Int
6,Int
5..Int
0]
{-# INLINE hashBalancingLF2 #-}
hashBasicLF2 ::  Int8 -> [Integer] -> Integer
hashBasicLF2 :: Int8 -> [Integer] -> Integer
hashBasicLF2 Int8
_ = forall a. Num a => [a] -> a
sum
{-# INLINE hashBasicLF2 #-}