Search is not available for this dataset
repo_name
string
path
string
license
string
full_code
string
full_size
int64
uncommented_code
string
uncommented_size
int64
function_only_code
string
function_only_size
int64
is_commented
bool
is_signatured
bool
n_ast_errors
int64
ast_max_depth
int64
n_whitespaces
int64
n_ast_nodes
int64
n_ast_terminals
int64
n_ast_nonterminals
int64
loc
int64
cycloplexity
int64
league/postgrest
src/PostgREST/Parsers.hs
mit
pOperatiorWithNegation :: Parser Operator pOperatiorWithNegation = try ( (<>) <$> ( cs <$> string "not." ) <*> pOperator) <|> pOperator
136
pOperatiorWithNegation :: Parser Operator pOperatiorWithNegation = try ( (<>) <$> ( cs <$> string "not." ) <*> pOperator) <|> pOperator
136
pOperatiorWithNegation = try ( (<>) <$> ( cs <$> string "not." ) <*> pOperator) <|> pOperator
94
false
true
0
12
20
44
23
21
null
null
matonix/pfds
src/PFDS/Sec9/Ex13_2.hs
bsd-3-clause
fixup :: RList a -> RList a fixup (Zero : ds) = let (Node _ t1 t2, ds') = unconsTree ds in Two [t1, t2] : ds'
109
fixup :: RList a -> RList a fixup (Zero : ds) = let (Node _ t1 t2, ds') = unconsTree ds in Two [t1, t2] : ds'
109
fixup (Zero : ds) = let (Node _ t1 t2, ds') = unconsTree ds in Two [t1, t2] : ds'
81
false
true
0
10
26
72
35
37
null
null
cutsea110/tut
Application.hs
bsd-2-clause
-- This function allocates resources (such as a database connection pool), -- performs initialization and creates a WAI application. This is also the -- place to put your migrate statements to have automatic database -- migrations handled by Yesod. withTut :: AppConfig DefaultEnv -> Logger -> (Application -> IO ()) -> IO () withTut conf logger f = do #ifdef PRODUCTION s <- static Settings.staticDir #else s <- staticDevel Settings.staticDir #endif dbconf <- withYamlEnvironment "config/sqlite.yml" (appEnv conf) $ either error return . Database.Persist.Base.loadConfig Database.Persist.Base.withPool (dbconf :: Settings.PersistConfig) $ \p -> do Database.Persist.Base.runPool dbconf (runMigration migrateAll) p let h = Tut conf logger s p defaultRunner f h -- for yesod devel
831
withTut :: AppConfig DefaultEnv -> Logger -> (Application -> IO ()) -> IO () withTut conf logger f = do #ifdef PRODUCTION s <- static Settings.staticDir #else s <- staticDevel Settings.staticDir #endif dbconf <- withYamlEnvironment "config/sqlite.yml" (appEnv conf) $ either error return . Database.Persist.Base.loadConfig Database.Persist.Base.withPool (dbconf :: Settings.PersistConfig) $ \p -> do Database.Persist.Base.runPool dbconf (runMigration migrateAll) p let h = Tut conf logger s p defaultRunner f h -- for yesod devel
582
withTut conf logger f = do #ifdef PRODUCTION s <- static Settings.staticDir #else s <- staticDevel Settings.staticDir #endif dbconf <- withYamlEnvironment "config/sqlite.yml" (appEnv conf) $ either error return . Database.Persist.Base.loadConfig Database.Persist.Base.withPool (dbconf :: Settings.PersistConfig) $ \p -> do Database.Persist.Base.runPool dbconf (runMigration migrateAll) p let h = Tut conf logger s p defaultRunner f h -- for yesod devel
505
true
true
0
14
163
178
90
88
null
null
AlexanderPankiv/ghc
compiler/prelude/PrelNames.hs
bsd-3-clause
typeable4ClassKey = mkPreludeClassUnique 24
49
typeable4ClassKey = mkPreludeClassUnique 24
49
typeable4ClassKey = mkPreludeClassUnique 24
49
false
false
0
5
9
9
4
5
null
null
mkm/sokoban
src/Tree.hs
gpl-3.0
mergeBranches (Branch ll lK lV Leaf) r = Branch ll lK lV r
58
mergeBranches (Branch ll lK lV Leaf) r = Branch ll lK lV r
58
mergeBranches (Branch ll lK lV Leaf) r = Branch ll lK lV r
58
false
false
0
7
12
32
15
17
null
null
keithodulaigh/Hets
CommonLogic/PredefinedCASLAxioms.hs
gpl-2.0
-- | setting casl sign: sorts, cons, nil, append listSig :: CASLSign listSig = (emptySign ()) { sortRel = Rel.fromKeysSet $ Set.fromList [list, individual] , opMap = MapSet.fromList [ (cons, [consTypeS]) , (nil, [nilTypeS]) , (append, [appendTypeS]) ] , globAnnos = emptyGlobalAnnos { literal_annos = emptyLiteralAnnos { list_lit = Map.singleton brId (nil, cons) } , literal_map = Map.fromList [ (cons, ListCons brId nil) , (nil, ListNull brId)]} }
744
listSig :: CASLSign listSig = (emptySign ()) { sortRel = Rel.fromKeysSet $ Set.fromList [list, individual] , opMap = MapSet.fromList [ (cons, [consTypeS]) , (nil, [nilTypeS]) , (append, [appendTypeS]) ] , globAnnos = emptyGlobalAnnos { literal_annos = emptyLiteralAnnos { list_lit = Map.singleton brId (nil, cons) } , literal_map = Map.fromList [ (cons, ListCons brId nil) , (nil, ListNull brId)]} }
695
listSig = (emptySign ()) { sortRel = Rel.fromKeysSet $ Set.fromList [list, individual] , opMap = MapSet.fromList [ (cons, [consTypeS]) , (nil, [nilTypeS]) , (append, [appendTypeS]) ] , globAnnos = emptyGlobalAnnos { literal_annos = emptyLiteralAnnos { list_lit = Map.singleton brId (nil, cons) } , literal_map = Map.fromList [ (cons, ListCons brId nil) , (nil, ListNull brId)]} }
675
true
true
0
13
363
171
98
73
null
null
sayon/lenses-talk
lenses.hs
gpl-2.0
john = Person 42 "John" $ Address "France" "Rue" 42
52
john = Person 42 "John" $ Address "France" "Rue" 42
52
john = Person 42 "John" $ Address "France" "Rue" 42
52
false
false
1
6
10
26
10
16
null
null
kim/amazonka
amazonka-ec2/gen/Network/AWS/EC2/RunInstances.hs
mpl-2.0
-- | One or more instances. rirInstances :: Lens' RunInstancesResponse [Instance] rirInstances = lens _rirInstances (\s a -> s { _rirInstances = a }) . _List
157
rirInstances :: Lens' RunInstancesResponse [Instance] rirInstances = lens _rirInstances (\s a -> s { _rirInstances = a }) . _List
129
rirInstances = lens _rirInstances (\s a -> s { _rirInstances = a }) . _List
75
true
true
0
10
25
47
26
21
null
null
duairc/opaleye-x
src/Opaleye/X/Optional.hs
mpl-2.0
------------------------------------------------------------------------------ defaults :: forall a. Defaults a => Optional a defaults = let DefaultsPP n = p in Optional n where p = def :: DefaultsPP (DistributeOption a) (DistributeOption a) ------------------------------------------------------------------------------
328
defaults :: forall a. Defaults a => Optional a defaults = let DefaultsPP n = p in Optional n where p = def :: DefaultsPP (DistributeOption a) (DistributeOption a) ------------------------------------------------------------------------------
249
defaults = let DefaultsPP n = p in Optional n where p = def :: DefaultsPP (DistributeOption a) (DistributeOption a) ------------------------------------------------------------------------------
202
true
true
0
9
38
74
36
38
null
null
LevelFiveElixirStorage/haskell
conway.hs
unlicense
readBoard :: String -> Board readBoard s = map (map readCell) (lines s)
71
readBoard :: String -> Board readBoard s = map (map readCell) (lines s)
71
readBoard s = map (map readCell) (lines s)
42
false
true
0
7
12
38
18
20
null
null
geraldus/yesod
yesod-form/Yesod/Form/Functions.hs
mit
getKey :: Text getKey = "_hasdata"
34
getKey :: Text getKey = "_hasdata"
34
getKey = "_hasdata"
19
false
true
0
6
5
18
7
11
null
null
abakst/symmetry
checker/src/Symmetry/SymbEx.hs
mit
symLt x y = SE $ do xv <- runSE x yv <- runSE y return $ APred Nothing (Just (opPred IL.Lt xv yv)) -------------------------------------------------
176
symLt x y = SE $ do xv <- runSE x yv <- runSE y return $ APred Nothing (Just (opPred IL.Lt xv yv)) -------------------------------------------------
176
symLt x y = SE $ do xv <- runSE x yv <- runSE y return $ APred Nothing (Just (opPred IL.Lt xv yv)) -------------------------------------------------
176
false
false
3
14
52
72
30
42
null
null
epsilonhalbe/accelerate-typelits
test/Test/Data/Array/Accelerate/TypeLits/System/Random/MWC.hs
isc
unitTests :: TestTree unitTests = testGroup "Unit tests" [--hunit ]
71
unitTests :: TestTree unitTests = testGroup "Unit tests" [--hunit ]
71
unitTests = testGroup "Unit tests" [--hunit ]
49
false
true
0
6
13
27
11
16
null
null
yiannist/ganeti
src/Ganeti/Constants.hs
bsd-2-clause
-- * RPC rpcEncodingNone :: Int rpcEncodingNone = 0
52
rpcEncodingNone :: Int rpcEncodingNone = 0
42
rpcEncodingNone = 0
19
true
true
0
4
9
12
7
5
null
null
brendanhay/gogol
gogol-healthcare/gen/Network/Google/Resource/Healthcare/Projects/Locations/DataSets/Hl7V2Stores/TestIAMPermissions.hs
mpl-2.0
-- | Multipart request metadata. pldshvstipPayload :: Lens' ProjectsLocationsDataSetsHl7V2StoresTestIAMPermissions TestIAMPermissionsRequest pldshvstipPayload = lens _pldshvstipPayload (\ s a -> s{_pldshvstipPayload = a})
229
pldshvstipPayload :: Lens' ProjectsLocationsDataSetsHl7V2StoresTestIAMPermissions TestIAMPermissionsRequest pldshvstipPayload = lens _pldshvstipPayload (\ s a -> s{_pldshvstipPayload = a})
196
pldshvstipPayload = lens _pldshvstipPayload (\ s a -> s{_pldshvstipPayload = a})
88
true
true
1
9
28
45
22
23
null
null
ambiata/highlighting-kate
Text/Highlighting/Kate/Syntax/Vhdl.hs
gpl-2.0
list_forOrWhile = Set.fromList $ words $ "loop"
47
list_forOrWhile = Set.fromList $ words $ "loop"
47
list_forOrWhile = Set.fromList $ words $ "loop"
47
false
false
1
7
6
20
8
12
null
null
vizziv/Darjeelang
darjeelang.hs
mit
branch exp1 exp2 exp3 = E $ EBranch exp1 exp2 exp3
50
branch exp1 exp2 exp3 = E $ EBranch exp1 exp2 exp3
50
branch exp1 exp2 exp3 = E $ EBranch exp1 exp2 exp3
50
false
false
0
6
10
24
11
13
null
null
alpmestan/accelerate-blas
src/Data/Array/Accelerate/BLAS/Internal/Nrm2.hs
bsd-3-clause
dnrm2 :: Acc (Vector Double) -> Acc (Scalar Double) dnrm2 = foreignAcc foreignNrm2D pureNrm2D where foreignNrm2D = CUDAForeignAcc "cudaNrm2D" cudaNrm2D pureNrm2D :: Acc (Vector Double) -> Acc (Scalar Double) pureNrm2D = map sqrt . fold (+) 0 . map (\x -> x*x)
286
dnrm2 :: Acc (Vector Double) -> Acc (Scalar Double) dnrm2 = foreignAcc foreignNrm2D pureNrm2D where foreignNrm2D = CUDAForeignAcc "cudaNrm2D" cudaNrm2D pureNrm2D :: Acc (Vector Double) -> Acc (Scalar Double) pureNrm2D = map sqrt . fold (+) 0 . map (\x -> x*x)
286
dnrm2 = foreignAcc foreignNrm2D pureNrm2D where foreignNrm2D = CUDAForeignAcc "cudaNrm2D" cudaNrm2D pureNrm2D :: Acc (Vector Double) -> Acc (Scalar Double) pureNrm2D = map sqrt . fold (+) 0 . map (\x -> x*x)
234
false
true
5
8
68
116
57
59
null
null
spencerjanssen/cabal2nix
src/Cabal2Nix/PostProcess.hs
bsd-3-clause
agdaPostInstall :: String agdaPostInstall = unlines [ "postInstall = ''" , " $out/bin/agda -c --no-main $(find $out/share -name Primitive.agda)" , " $out/bin/agda-mode compile" , "'';" ]
198
agdaPostInstall :: String agdaPostInstall = unlines [ "postInstall = ''" , " $out/bin/agda -c --no-main $(find $out/share -name Primitive.agda)" , " $out/bin/agda-mode compile" , "'';" ]
198
agdaPostInstall = unlines [ "postInstall = ''" , " $out/bin/agda -c --no-main $(find $out/share -name Primitive.agda)" , " $out/bin/agda-mode compile" , "'';" ]
172
false
true
0
5
37
26
15
11
null
null
diku-dk/futhark
src/Language/Futhark/Traversals.hs
isc
bareDimIndex (DimSlice x y z) = DimSlice (bareExp <$> x) (bareExp <$> y) (bareExp <$> z)
90
bareDimIndex (DimSlice x y z) = DimSlice (bareExp <$> x) (bareExp <$> y) (bareExp <$> z)
90
bareDimIndex (DimSlice x y z) = DimSlice (bareExp <$> x) (bareExp <$> y) (bareExp <$> z)
90
false
false
0
7
17
49
24
25
null
null
fpoli/lambda
test/Lambda/TestParser.hs
gpl-3.0
tests :: Test tests = test [ assertEqual "Test parse x" (Just (VarTerm (Variable "x"))) (parse "x") , assertEqual "Test parse ab" (Just (VarTerm (Variable "ab"))) (parse "ab") , assertEqual "Test parse ab12" (Just (VarTerm (Variable "ab12"))) (parse "ab12") , assertEqual "Test parse (x" Nothing (parse "(x") , assertEqual "Test parse .x" Nothing (parse ".x") , assertEqual "Test parse x$pippo" Nothing (parse "x$pippo") , assertEqual "Test parse (x)" (Just (VarTerm (Variable "x"))) (parse "(x)") , assertEqual "Test parse x(y)" (Just (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y")))) (parse "x(y)") , assertEqual "Test parse (x)(y)" (Just (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y")))) (parse "(x)(y)") , assertEqual "Test parse (x)(y)(z)" (Just (Apply (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y"))) (VarTerm (Variable "z")))) (parse "(x)(y)(z)") , assertEqual "Test parse (x)((y)(z))" (Just (Apply (VarTerm (Variable "x")) (Apply (VarTerm (Variable "y")) (VarTerm (Variable "z"))))) (parse "(x)((y)(z))") , assertEqual "Test parse λx.m" (Just (Lambda (Variable "x") (VarTerm (Variable "m")))) (parse "λx.m") , assertEqual "Test parse λx.λy.z" (Just (Lambda (Variable "x") (Lambda (Variable "y") (VarTerm (Variable "z"))))) (parse "λx.λy.z") , assertEqual "Test parse λx.λy.z(a)" (Just (Lambda (Variable "x") (Lambda (Variable "y") (Apply (VarTerm (Variable "z")) (VarTerm (Variable "a")))))) (parse "λx.λy.z(a)") , assertEqual "Test parse λx.x(y)" (Just (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y"))))) (parse "λx.x(y)") , assertEqual "Test parse (λy.y)(x)" (Just (Apply (Lambda (Variable "y") (VarTerm (Variable "y"))) (VarTerm (Variable "x")))) (parse "(λy.y)(x)") , assertEqual "Test parse (λx.x(x))(λx.x(x))" (Just (Apply (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "x")))) (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "x")))))) (parse "(λx.x(x))(λx.x(x))") ]
3,503
tests :: Test tests = test [ assertEqual "Test parse x" (Just (VarTerm (Variable "x"))) (parse "x") , assertEqual "Test parse ab" (Just (VarTerm (Variable "ab"))) (parse "ab") , assertEqual "Test parse ab12" (Just (VarTerm (Variable "ab12"))) (parse "ab12") , assertEqual "Test parse (x" Nothing (parse "(x") , assertEqual "Test parse .x" Nothing (parse ".x") , assertEqual "Test parse x$pippo" Nothing (parse "x$pippo") , assertEqual "Test parse (x)" (Just (VarTerm (Variable "x"))) (parse "(x)") , assertEqual "Test parse x(y)" (Just (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y")))) (parse "x(y)") , assertEqual "Test parse (x)(y)" (Just (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y")))) (parse "(x)(y)") , assertEqual "Test parse (x)(y)(z)" (Just (Apply (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y"))) (VarTerm (Variable "z")))) (parse "(x)(y)(z)") , assertEqual "Test parse (x)((y)(z))" (Just (Apply (VarTerm (Variable "x")) (Apply (VarTerm (Variable "y")) (VarTerm (Variable "z"))))) (parse "(x)((y)(z))") , assertEqual "Test parse λx.m" (Just (Lambda (Variable "x") (VarTerm (Variable "m")))) (parse "λx.m") , assertEqual "Test parse λx.λy.z" (Just (Lambda (Variable "x") (Lambda (Variable "y") (VarTerm (Variable "z"))))) (parse "λx.λy.z") , assertEqual "Test parse λx.λy.z(a)" (Just (Lambda (Variable "x") (Lambda (Variable "y") (Apply (VarTerm (Variable "z")) (VarTerm (Variable "a")))))) (parse "λx.λy.z(a)") , assertEqual "Test parse λx.x(y)" (Just (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y"))))) (parse "λx.x(y)") , assertEqual "Test parse (λy.y)(x)" (Just (Apply (Lambda (Variable "y") (VarTerm (Variable "y"))) (VarTerm (Variable "x")))) (parse "(λy.y)(x)") , assertEqual "Test parse (λx.x(x))(λx.x(x))" (Just (Apply (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "x")))) (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "x")))))) (parse "(λx.x(x))(λx.x(x))") ]
3,503
tests = test [ assertEqual "Test parse x" (Just (VarTerm (Variable "x"))) (parse "x") , assertEqual "Test parse ab" (Just (VarTerm (Variable "ab"))) (parse "ab") , assertEqual "Test parse ab12" (Just (VarTerm (Variable "ab12"))) (parse "ab12") , assertEqual "Test parse (x" Nothing (parse "(x") , assertEqual "Test parse .x" Nothing (parse ".x") , assertEqual "Test parse x$pippo" Nothing (parse "x$pippo") , assertEqual "Test parse (x)" (Just (VarTerm (Variable "x"))) (parse "(x)") , assertEqual "Test parse x(y)" (Just (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y")))) (parse "x(y)") , assertEqual "Test parse (x)(y)" (Just (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y")))) (parse "(x)(y)") , assertEqual "Test parse (x)(y)(z)" (Just (Apply (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y"))) (VarTerm (Variable "z")))) (parse "(x)(y)(z)") , assertEqual "Test parse (x)((y)(z))" (Just (Apply (VarTerm (Variable "x")) (Apply (VarTerm (Variable "y")) (VarTerm (Variable "z"))))) (parse "(x)((y)(z))") , assertEqual "Test parse λx.m" (Just (Lambda (Variable "x") (VarTerm (Variable "m")))) (parse "λx.m") , assertEqual "Test parse λx.λy.z" (Just (Lambda (Variable "x") (Lambda (Variable "y") (VarTerm (Variable "z"))))) (parse "λx.λy.z") , assertEqual "Test parse λx.λy.z(a)" (Just (Lambda (Variable "x") (Lambda (Variable "y") (Apply (VarTerm (Variable "z")) (VarTerm (Variable "a")))))) (parse "λx.λy.z(a)") , assertEqual "Test parse λx.x(y)" (Just (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "y"))))) (parse "λx.x(y)") , assertEqual "Test parse (λy.y)(x)" (Just (Apply (Lambda (Variable "y") (VarTerm (Variable "y"))) (VarTerm (Variable "x")))) (parse "(λy.y)(x)") , assertEqual "Test parse (λx.x(x))(λx.x(x))" (Just (Apply (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "x")))) (Lambda (Variable "x") (Apply (VarTerm (Variable "x")) (VarTerm (Variable "x")))))) (parse "(λx.x(x))(λx.x(x))") ]
3,489
false
true
0
19
1,771
904
452
452
null
null
svaiter/fay-canvas
src/HtmlCanvas.hs
bsd-3-clause
setGlobalCompositeOperation :: String -> Context -> Fay () setGlobalCompositeOperation = ffi "%2['globalCompositeOperation']=%1"
128
setGlobalCompositeOperation :: String -> Context -> Fay () setGlobalCompositeOperation = ffi "%2['globalCompositeOperation']=%1"
128
setGlobalCompositeOperation = ffi "%2['globalCompositeOperation']=%1"
69
false
true
0
8
11
27
13
14
null
null
li-zhirui/EoplLangs
src/ExceptionLang/Evaluator.hs
bsd-3-clause
evalLetExpr :: [(String, Expression)] -> Expression -> Environment -> Continuation -> EvaluateResult evalLetExpr [] body env cont = valueOf body env cont
177
evalLetExpr :: [(String, Expression)] -> Expression -> Environment -> Continuation -> EvaluateResult evalLetExpr [] body env cont = valueOf body env cont
177
evalLetExpr [] body env cont = valueOf body env cont
52
false
true
0
8
45
54
28
26
null
null
nbloomf/carl
src/Carl/Data/Monomial.hs
gpl-3.0
monomialLCM :: (Ord a) => Monomial a -> Monomial a -> Monomial a monomialLCM m1 m2 = Monomial $ M.unionWith natMax (unMonomial m1) (unMonomial m2)
146
monomialLCM :: (Ord a) => Monomial a -> Monomial a -> Monomial a monomialLCM m1 m2 = Monomial $ M.unionWith natMax (unMonomial m1) (unMonomial m2)
146
monomialLCM m1 m2 = Monomial $ M.unionWith natMax (unMonomial m1) (unMonomial m2)
81
false
true
0
9
24
71
33
38
null
null
tnrangwi/haskellGames4iPad
Labyrinth3d.hs
mit
-- | Wait for arbitrary key getOK :: IO () getOK = getChar >> return ()
71
getOK :: IO () getOK = getChar >> return ()
43
getOK = getChar >> return ()
28
true
true
2
7
15
32
14
18
null
null
zsol/visual-graphrewrite
GraphRewrite/Internal/Rewrite.hs
bsd-3-clause
matchFine rs g (SLit y) e binds = let tree = rewriteStepFine rs e g in case lastGraph tree of (SLit x, _) | x == y -> (Just binds, [tree]) _ -> (Nothing, [])
212
matchFine rs g (SLit y) e binds = let tree = rewriteStepFine rs e g in case lastGraph tree of (SLit x, _) | x == y -> (Just binds, [tree]) _ -> (Nothing, [])
212
matchFine rs g (SLit y) e binds = let tree = rewriteStepFine rs e g in case lastGraph tree of (SLit x, _) | x == y -> (Just binds, [tree]) _ -> (Nothing, [])
212
false
false
1
13
89
107
49
58
null
null
shlevy/ghc
testsuite/tests/pmcheck/should_compile/EmptyCase010.hs
bsd-3-clause
f29 :: Baz (DC Bool) Char -> () f29 = \case
43
f29 :: Baz (DC Bool) Char -> () f29 = \case
43
f29 = \case
11
false
true
0
9
10
36
16
20
null
null
BartAdv/hoogle
src/Output/Types.hs
bsd-3-clause
writeFingerprints :: StoreWrite -> [Fingerprint] -> IO () writeFingerprints store xs = storeWriteV store $ V.fromList xs
120
writeFingerprints :: StoreWrite -> [Fingerprint] -> IO () writeFingerprints store xs = storeWriteV store $ V.fromList xs
120
writeFingerprints store xs = storeWriteV store $ V.fromList xs
62
false
true
0
8
16
44
21
23
null
null
mankyKitty/leesp
src/Main.hs
mit
makeStringN :: [LispVal] -> ThrowsError LispVal makeStringN [Number n, Character c] = (return . String . L.genericTake n) $ repeat c
132
makeStringN :: [LispVal] -> ThrowsError LispVal makeStringN [Number n, Character c] = (return . String . L.genericTake n) $ repeat c
132
makeStringN [Number n, Character c] = (return . String . L.genericTake n) $ repeat c
84
false
true
0
9
20
63
30
33
null
null
patperry/hs-linear-algebra
tests/STVector.hs
bsd-3-clause
binaryProp :: (AEq e, Arbitrary e, Show e, Storable e, Testable a) => e -> (Vector e -> Vector e) -> (forall s . STVector s e -> STVector s e -> ST s a) -> Property binaryProp t imm_f f = let prop2 t (VectorPair x y) = runST $ let _ = typed t x in x `readOnlyVector` \mx -> y `mutatesToVector` (imm_f x) $ \my -> f my mx where _ = typed t x in label "" prop2
436
binaryProp :: (AEq e, Arbitrary e, Show e, Storable e, Testable a) => e -> (Vector e -> Vector e) -> (forall s . STVector s e -> STVector s e -> ST s a) -> Property binaryProp t imm_f f = let prop2 t (VectorPair x y) = runST $ let _ = typed t x in x `readOnlyVector` \mx -> y `mutatesToVector` (imm_f x) $ \my -> f my mx where _ = typed t x in label "" prop2
436
binaryProp t imm_f f = let prop2 t (VectorPair x y) = runST $ let _ = typed t x in x `readOnlyVector` \mx -> y `mutatesToVector` (imm_f x) $ \my -> f my mx where _ = typed t x in label "" prop2
223
false
true
0
17
159
207
102
105
null
null
mrehayden1/lji
src/LJI/Run.hs
bsd-3-clause
targetMelody :: [Int] -> Staff Note -> Environment (Staff Note) targetMelody ts ns = do d <- asks optDur let nss = flip evalState (drop 1 . cycle . toList $ ns) . mapM (targetMelody' d ts) $ ns return . over WrapStaff (fmap fold) $ nss where targetMelody' :: Dur -> [Int] -> Note -> State [Note] (Section Note) targetMelody' d ts n = do ns <- gets (target d ts n . head) modify (drop 1) return . fromList $ ns
459
targetMelody :: [Int] -> Staff Note -> Environment (Staff Note) targetMelody ts ns = do d <- asks optDur let nss = flip evalState (drop 1 . cycle . toList $ ns) . mapM (targetMelody' d ts) $ ns return . over WrapStaff (fmap fold) $ nss where targetMelody' :: Dur -> [Int] -> Note -> State [Note] (Section Note) targetMelody' d ts n = do ns <- gets (target d ts n . head) modify (drop 1) return . fromList $ ns
459
targetMelody ts ns = do d <- asks optDur let nss = flip evalState (drop 1 . cycle . toList $ ns) . mapM (targetMelody' d ts) $ ns return . over WrapStaff (fmap fold) $ nss where targetMelody' :: Dur -> [Int] -> Note -> State [Note] (Section Note) targetMelody' d ts n = do ns <- gets (target d ts n . head) modify (drop 1) return . fromList $ ns
395
false
true
0
17
132
218
103
115
null
null
NickAger/LearningHaskell
HaskellProgrammingFromFirstPrinciples/Chapter15.hsproj/SemiGroup8.hs
mit
test2 = TestCase (assertEqual "right fst propogated" (Fst 1 <> Fst 2) (Fst 2))
78
test2 = TestCase (assertEqual "right fst propogated" (Fst 1 <> Fst 2) (Fst 2))
78
test2 = TestCase (assertEqual "right fst propogated" (Fst 1 <> Fst 2) (Fst 2))
78
false
false
1
10
13
42
18
24
null
null
travitch/language-python-builder
src/Language/Python/Common/Builder.hs
bsd-3-clause
binaryOrAO :: annot -> OpQ annot binaryOrAO = return . BinaryOr
63
binaryOrAO :: annot -> OpQ annot binaryOrAO = return . BinaryOr
63
binaryOrAO = return . BinaryOr
30
false
true
0
6
10
22
11
11
null
null
maurer/ptrace
src/System/PTrace.hs
bsd-3-clause
traceVFork = 0x4
16
traceVFork = 0x4
16
traceVFork = 0x4
16
false
false
1
5
2
10
3
7
null
null
TomMD/ghc
compiler/hsSyn/HsPat.hs
bsd-3-clause
pprPat (BangPat pat) = char '!' <> pprParendLPat pat
61
pprPat (BangPat pat) = char '!' <> pprParendLPat pat
61
pprPat (BangPat pat) = char '!' <> pprParendLPat pat
61
false
false
0
7
17
25
11
14
null
null
RoboNickBot/interactive-tree-demos
src/Hyper/Canvas.hs
bsd-2-clause
safeReadInput :: Read a => String -> a -> IO a safeReadInput n d = tryread d <$> readInput n
92
safeReadInput :: Read a => String -> a -> IO a safeReadInput n d = tryread d <$> readInput n
92
safeReadInput n d = tryread d <$> readInput n
45
false
true
0
8
19
44
20
24
null
null
megantti/rtorrent-rpc
Network/RTorrent/SCGI.hs
mit
makeRequest :: Body -> ByteString makeRequest (Body hd bd) = res where res = toByteString . mconcat $ [ integral len , fromChar ':' , fromByteString hdbs , fromChar ',' , fromByteString bd ] fromBS0 bs = fromWrite $ writeByteString bs <> writeWord8 0 hdbs = toByteString . mconcat $ (fromBS0 "CONTENT_LENGTH" <> integral (BS.length bd) <> fromWord8 0): map (\(a, b) -> fromBS0 a <> fromBS0 b) hd len = BS.length hdbs
499
makeRequest :: Body -> ByteString makeRequest (Body hd bd) = res where res = toByteString . mconcat $ [ integral len , fromChar ':' , fromByteString hdbs , fromChar ',' , fromByteString bd ] fromBS0 bs = fromWrite $ writeByteString bs <> writeWord8 0 hdbs = toByteString . mconcat $ (fromBS0 "CONTENT_LENGTH" <> integral (BS.length bd) <> fromWord8 0): map (\(a, b) -> fromBS0 a <> fromBS0 b) hd len = BS.length hdbs
499
makeRequest (Body hd bd) = res where res = toByteString . mconcat $ [ integral len , fromChar ':' , fromByteString hdbs , fromChar ',' , fromByteString bd ] fromBS0 bs = fromWrite $ writeByteString bs <> writeWord8 0 hdbs = toByteString . mconcat $ (fromBS0 "CONTENT_LENGTH" <> integral (BS.length bd) <> fromWord8 0): map (\(a, b) -> fromBS0 a <> fromBS0 b) hd len = BS.length hdbs
465
false
true
3
13
155
180
88
92
null
null
astanin/ditaa-img
ditaa-img.hs
mit
generateImage :: String -> String -> String -> IO ExitCode generateImage ditaaCommand imagename code = withSystemTempFile (imagename ++ "..txt") $ \tmpname tmphandle -> do let cmd = replace "INPUT" tmpname . replace "OUTPUT" imagename $ ditaaCommand hPutStrLn tmphandle code hClose tmphandle system2 cmd
340
generateImage :: String -> String -> String -> IO ExitCode generateImage ditaaCommand imagename code = withSystemTempFile (imagename ++ "..txt") $ \tmpname tmphandle -> do let cmd = replace "INPUT" tmpname . replace "OUTPUT" imagename $ ditaaCommand hPutStrLn tmphandle code hClose tmphandle system2 cmd
340
generateImage ditaaCommand imagename code = withSystemTempFile (imagename ++ "..txt") $ \tmpname tmphandle -> do let cmd = replace "INPUT" tmpname . replace "OUTPUT" imagename $ ditaaCommand hPutStrLn tmphandle code hClose tmphandle system2 cmd
281
false
true
0
15
79
106
47
59
null
null
geophf/1HaskellADay
exercises/HAD/Y2020/M12/D01/Solution.hs
mit
linkOrphanedCountries :: Set Continent -> Set Country -> Set OrphanedCountry -> CountryTriage linkOrphanedCountries cs1 cs2 ocs = execState (loc' cs1 cs2 (Set.toList ocs)) (Triage Map.empty Map.empty Set.empty)
249
linkOrphanedCountries :: Set Continent -> Set Country -> Set OrphanedCountry -> CountryTriage linkOrphanedCountries cs1 cs2 ocs = execState (loc' cs1 cs2 (Set.toList ocs)) (Triage Map.empty Map.empty Set.empty)
249
linkOrphanedCountries cs1 cs2 ocs = execState (loc' cs1 cs2 (Set.toList ocs)) (Triage Map.empty Map.empty Set.empty)
132
false
true
0
9
65
85
38
47
null
null
JPMoresmau/HJVM
src/Language/Java/JVM/API.hs
bsd-3-clause
charMethod :: (WithJava m) =>JObjectPtr -> Method -> [JValue] -> m (Char) charMethod obj m args= execMethod f_callCharMethod obj m args
138
charMethod :: (WithJava m) =>JObjectPtr -> Method -> [JValue] -> m (Char) charMethod obj m args= execMethod f_callCharMethod obj m args
135
charMethod obj m args= execMethod f_callCharMethod obj m args
61
false
true
0
10
23
57
29
28
null
null
ocean0yohsuke/Simply-Typed-Lambda
src/Lambda/DataType.hs
bsd-3-clause
char c = CHAR c Nothing
23
char c = CHAR c Nothing
23
char c = CHAR c Nothing
23
false
false
0
5
5
14
6
8
null
null
josuf107/Adverb
Adverb/Common.hs
gpl-3.0
heftily = id
12
heftily = id
12
heftily = id
12
false
false
0
4
2
6
3
3
null
null
mrlovre/super-memory
Pro3/src/LinguisticVariables/AngleLinguisticVariables.hs
gpl-3.0
sharpRightAngle :: AFuzzySet sharpRightAngle = lvVery $ angleFuzzySet (lFunctionGenerator angleSharpRightI angleRightI)
119
sharpRightAngle :: AFuzzySet sharpRightAngle = lvVery $ angleFuzzySet (lFunctionGenerator angleSharpRightI angleRightI)
119
sharpRightAngle = lvVery $ angleFuzzySet (lFunctionGenerator angleSharpRightI angleRightI)
90
false
true
0
8
10
26
13
13
null
null
vikraman/ghc
compiler/hsSyn/HsDecls.hs
bsd-3-clause
-- | closed type family info isClosedTypeFamilyInfo :: FamilyInfo name -> Bool isClosedTypeFamilyInfo (ClosedTypeFamily {}) = True
130
isClosedTypeFamilyInfo :: FamilyInfo name -> Bool isClosedTypeFamilyInfo (ClosedTypeFamily {}) = True
101
isClosedTypeFamilyInfo (ClosedTypeFamily {}) = True
51
true
true
0
7
16
29
15
14
null
null
rodrigo-machado/ufrgs-grt
src/Graph/TestRewriting.hs
gpl-3.0
rewriteOnError :: (Eq a, Eq b) => Rule a b -> TypedDigraph a b -> [Error (TypedDigraph a b)] rewriteOnError = rewrite
117
rewriteOnError :: (Eq a, Eq b) => Rule a b -> TypedDigraph a b -> [Error (TypedDigraph a b)] rewriteOnError = rewrite
117
rewriteOnError = rewrite
24
false
true
0
11
21
58
29
29
null
null
keera-studios/hssdl
Graphics/UI/SDL/RWOps.hs
bsd-3-clause
free :: RWops -> IO () free = #if defined(__GLASGOW_HASKELL__) finalizeForeignPtr
83
free :: RWops -> IO () free = #if defined(__GLASGOW_HASKELL__) finalizeForeignPtr
83
free = #if defined(__GLASGOW_HASKELL__) finalizeForeignPtr
60
false
true
0
7
12
21
11
10
null
null
lpeterse/HiggsSet
src/Data/HiggsSet.hs
bsd-3-clause
updateLookup :: (Indexable a, Index i, IndexOf a ~ i) => (a -> Maybe a) -> i -> HiggsSet a i -> (Maybe a, HiggsSet a i) updateLookup = updateLookupUnsafe [minBound..maxBound]
194
updateLookup :: (Indexable a, Index i, IndexOf a ~ i) => (a -> Maybe a) -> i -> HiggsSet a i -> (Maybe a, HiggsSet a i) updateLookup = updateLookupUnsafe [minBound..maxBound]
194
updateLookup = updateLookupUnsafe [minBound..maxBound]
61
false
true
0
10
50
86
43
43
null
null
chreekat/snowdrift
Model/User.hs
agpl-3.0
deleteUserDB :: UserId -> DB () deleteUserDB user_id = do deleteCommentsDB user_id deleteBlogPostsDB user_id deleteWikiEditsDB user_id deleteCascade user_id
172
deleteUserDB :: UserId -> DB () deleteUserDB user_id = do deleteCommentsDB user_id deleteBlogPostsDB user_id deleteWikiEditsDB user_id deleteCascade user_id
172
deleteUserDB user_id = do deleteCommentsDB user_id deleteBlogPostsDB user_id deleteWikiEditsDB user_id deleteCascade user_id
140
false
true
0
8
33
52
20
32
null
null
cocreature/leksah
src/IDE/Core/State.hs
gpl-2.0
-- Main window is always the first one in the list window = head . windows
74
window = head . windows
23
window = head . windows
23
true
false
2
5
15
16
6
10
null
null
HalfWayMan/mt-mongodb
src/Massive/Database/MongoDB/Template.hs
bsd-3-clause
indexedFieldName ∷ Int → Name indexedFieldName = mkName ∘ ("field" ++) ∘ show
77
indexedFieldName ∷ Int → Name indexedFieldName = mkName ∘ ("field" ++) ∘ show
77
indexedFieldName = mkName ∘ ("field" ++) ∘ show
47
false
true
0
7
12
27
15
12
null
null
lfritz/python-type-inference
python-type-inference/src/Language/Python/TypeInference/CFG/CFG.hs
bsd-3-clause
isRegularParameter _ = False
42
isRegularParameter _ = False
42
isRegularParameter _ = False
42
false
false
0
4
17
10
4
6
null
null
forked-upstream-packages-for-ghcjs/ghc
compiler/typecheck/TcEvidence.hs
bsd-3-clause
(<.>) :: HsWrapper -> HsWrapper -> HsWrapper WpHole <.> c = c
61
(<.>) :: HsWrapper -> HsWrapper -> HsWrapper WpHole <.> c = c
61
WpHole <.> c = c
16
false
true
0
6
11
27
14
13
null
null
metaml/dokreg
src/Pipes/Docker.hs
gpl-3.0
ports :: Maybe Object -> Maybe [Int] ports o = case o of Just obj -> let ports' = map (\p -> decimal p) $ map (\p -> head (splitOn "/" p)) $ Map.keys obj in return $ map (\pair -> fst pair) (rights ports') Nothing -> Nothing
272
ports :: Maybe Object -> Maybe [Int] ports o = case o of Just obj -> let ports' = map (\p -> decimal p) $ map (\p -> head (splitOn "/" p)) $ Map.keys obj in return $ map (\pair -> fst pair) (rights ports') Nothing -> Nothing
272
ports o = case o of Just obj -> let ports' = map (\p -> decimal p) $ map (\p -> head (splitOn "/" p)) $ Map.keys obj in return $ map (\pair -> fst pair) (rights ports') Nothing -> Nothing
235
false
true
0
19
95
137
65
72
null
null
ecaustin/haskhol-deductive
src/HaskHOL/Lib/Tactics.hs
bsd-2-clause
tacACCEPT :: (BoolCtxt thry, HOLThmRep thm cls thry) => ThmTactic thm cls thry tacACCEPT pthm (Goal _ w) = do thm@(Thm _ c) <- toHThm pthm if c `aConv` w then return . GS nullMeta [] $ propagateThm thm else fail "tacACCEPT" -- create a tactic from a conversion
293
tacACCEPT :: (BoolCtxt thry, HOLThmRep thm cls thry) => ThmTactic thm cls thry tacACCEPT pthm (Goal _ w) = do thm@(Thm _ c) <- toHThm pthm if c `aConv` w then return . GS nullMeta [] $ propagateThm thm else fail "tacACCEPT" -- create a tactic from a conversion
293
tacACCEPT pthm (Goal _ w) = do thm@(Thm _ c) <- toHThm pthm if c `aConv` w then return . GS nullMeta [] $ propagateThm thm else fail "tacACCEPT" -- create a tactic from a conversion
214
false
true
0
11
81
115
56
59
null
null
bredelings/BAli-Phy
haskell/Data/Tuple.hs
gpl-2.0
swap (x,y) = (y,x)
18
swap (x,y) = (y,x)
18
swap (x,y) = (y,x)
18
false
false
0
5
3
22
12
10
null
null
5outh/WeekOfPragmas
set.hs
mit
setBind :: Ord b => Set a -> (a -> Set b) -> Set b setBind s f = S.foldr S.union S.empty (S.map f s)
100
setBind :: Ord b => Set a -> (a -> Set b) -> Set b setBind s f = S.foldr S.union S.empty (S.map f s)
100
setBind s f = S.foldr S.union S.empty (S.map f s)
49
false
true
0
10
24
70
33
37
null
null
exercism/xhaskell
exercises/practice/forth/.meta/examples/success-standard/src/Forth.hs
mit
stepWord Subtract = with2 (push .: (-))
40
stepWord Subtract = with2 (push .: (-))
40
stepWord Subtract = with2 (push .: (-))
40
false
false
0
7
7
21
11
10
null
null
bitemyapp/node-manager
src/Node/Manager.hs
bsd-3-clause
startServer :: NodeManagerConfig -> NodeManager -> IO () startServer nc nmFoundation = do app <- toWaiApp nmFoundation let nodeManagerDefaults = setTimeout (3*60). (setHost.getHostPreference.nodeManagerHost $ nc). (setPort.nodeManagerPort $ nc) $ defaultSettings runSettings nodeManagerDefaults app
363
startServer :: NodeManagerConfig -> NodeManager -> IO () startServer nc nmFoundation = do app <- toWaiApp nmFoundation let nodeManagerDefaults = setTimeout (3*60). (setHost.getHostPreference.nodeManagerHost $ nc). (setPort.nodeManagerPort $ nc) $ defaultSettings runSettings nodeManagerDefaults app
363
startServer nc nmFoundation = do app <- toWaiApp nmFoundation let nodeManagerDefaults = setTimeout (3*60). (setHost.getHostPreference.nodeManagerHost $ nc). (setPort.nodeManagerPort $ nc) $ defaultSettings runSettings nodeManagerDefaults app
306
false
true
0
16
97
98
47
51
null
null
beni55/text
tests/Tests/Properties.hs
bsd-2-clause
t_intercalate c = unsquare $ L.intercalate c `eq` (unpackS . T.intercalate (packS c) . map packS)
139
t_intercalate c = unsquare $ L.intercalate c `eq` (unpackS . T.intercalate (packS c) . map packS)
139
t_intercalate c = unsquare $ L.intercalate c `eq` (unpackS . T.intercalate (packS c) . map packS)
139
false
false
0
11
57
49
24
25
null
null
flowbox-public/ghcjs
src/Gen2/DynamicLinking.hs
mit
throwCmdLineError :: String -> IO a throwCmdLineError = throwGhcExceptionIO . CmdLineError
90
throwCmdLineError :: String -> IO a throwCmdLineError = throwGhcExceptionIO . CmdLineError
90
throwCmdLineError = throwGhcExceptionIO . CmdLineError
54
false
true
0
6
10
22
11
11
null
null
Cahu/krpc-hs
src/KRPCHS/SpaceCenter.hs
gpl-3.0
getFlightAntiRadialStream :: KRPCHS.SpaceCenter.Flight -> RPCContext (KRPCStream ((Double, Double, Double))) getFlightAntiRadialStream thisArg = requestStream $ getFlightAntiRadialStreamReq thisArg
197
getFlightAntiRadialStream :: KRPCHS.SpaceCenter.Flight -> RPCContext (KRPCStream ((Double, Double, Double))) getFlightAntiRadialStream thisArg = requestStream $ getFlightAntiRadialStreamReq thisArg
197
getFlightAntiRadialStream thisArg = requestStream $ getFlightAntiRadialStreamReq thisArg
88
false
true
0
10
15
52
27
25
null
null
DavidAlphaFox/darcs
hashed-storage/Storage/Hashed/Test.hs
gpl-2.0
tree :: [TF.Test] tree = [ testCase "modifyTree" check_modify , testCase "complex modifyTree" check_modify_complex , testCase "modifyTree removal" check_modify_remove , testCase "expand" check_expand , testCase "expandPath" check_expand_path , testCase "expandPath of sub" check_expand_path_sub , testCase "diffTrees" check_diffTrees , testCase "diffTrees identical" check_diffTrees_ident , testProperty "expandPath" prop_expandPath , testProperty "shapeEq" prop_shape_eq , testProperty "expandedShapeEq" prop_expanded_shape_eq , testProperty "expand is identity" prop_expand_id , testProperty "filter True is identity" prop_filter_id , testProperty "filter False is empty" prop_filter_empty , testProperty "restrict both ways keeps shape" prop_restrict_shape_commutative , testProperty "restrict is a subtree of both" prop_restrict_subtree , testProperty "overlay keeps shape" prop_overlay_shape , testProperty "overlay is superset of over" prop_overlay_super ] where blob x = File $ Blob (return (BL.pack x)) (sha256 $ BL.pack x) name = Name . BS.pack check_modify = let t = makeTree [(name "foo", blob "bar")] modify = modifyTree t (floatPath "foo") (Just $ blob "bla") in do x <- readBlob $ fromJust $ findFile t (floatPath "foo") y <- readBlob $ fromJust $ findFile modify (floatPath "foo") assertEqual "old version" x (BL.pack "bar") assertEqual "new version" y (BL.pack "bla") assertBool "list has foo" $ isJust (Prelude.lookup (floatPath "foo") $ list modify) length (list modify) @?= 1 check_modify_complex = let t = makeTree [ (name "foo", blob "bar") , (name "bar", SubTree t1) ] t1 = makeTree [ (name "foo", blob "bar") ] modify = modifyTree t (floatPath "bar/foo") (Just $ blob "bla") in do foo <- readBlob $ fromJust $ findFile t (floatPath "foo") foo' <- readBlob $ fromJust $ findFile modify (floatPath "foo") bar_foo <- readBlob $ fromJust $ findFile t (floatPath "bar/foo") bar_foo' <- readBlob $ fromJust $ findFile modify (floatPath "bar/foo") assertEqual "old foo" foo (BL.pack "bar") assertEqual "old bar/foo" bar_foo (BL.pack "bar") assertEqual "new foo" foo' (BL.pack "bar") assertEqual "new bar/foo" bar_foo' (BL.pack "bla") assertBool "list has bar/foo" $ isJust (Prelude.lookup (floatPath "bar/foo") $ list modify) assertBool "list has foo" $ isJust (Prelude.lookup (floatPath "foo") $ list modify) length (list modify) @?= length (list t) check_modify_remove = let t1 = makeTree [(name "foo", blob "bar")] t2 :: Tree Identity = makeTree [ (name "foo", blob "bar") , (name "bar", SubTree t1) ] modify1 = modifyTree t1 (floatPath "foo") Nothing modify2 = modifyTree t2 (floatPath "bar") Nothing file = findFile modify1 (floatPath "foo") subtree = findTree modify2 (floatPath "bar") in do assertBool "file is gone" (isNothing file) assertBool "subtree is gone" (isNothing subtree) no_stubs t = null [ () | (_, Stub _ _) <- list t ] path = floatPath "substub/substub/file" badpath = floatPath "substub/substub/foo" check_expand = do x <- expand testTree assertBool "no stubs in testTree" $ not (no_stubs testTree) assertBool "stubs in expanded tree" $ no_stubs x assertBool "path reachable" $ path `elem` (map fst $ list x) assertBool "badpath not reachable" $ badpath `notElem` (map fst $ list x) check_expand_path = do test_exp <- expand testTree t <- expandPath testTree path t' <- expandPath test_exp path t'' <- expandPath testTree $ floatPath "substub/x" assertBool "path not reachable in testTree" $ path `notElem` (map fst $ list testTree) assertBool "path reachable in t" $ path `elem` (map fst $ list t) assertBool "path reachable in t'" $ path `elem` (map fst $ list t') assertBool "path reachable in t (with findFile)" $ isJust $ findFile t path assertBool "path reachable in t' (with findFile)" $ isJust $ findFile t' path assertBool "path not reachable in t''" $ path `notElem` (map fst $ list t'') assertBool "badpath not reachable in t" $ badpath `notElem` (map fst $ list t) assertBool "badpath not reachable in t'" $ badpath `notElem` (map fst $ list t') check_expand_path_sub = do t <- expandPath testTree $ floatPath "substub" t' <- expandPath testTree $ floatPath "substub/stub" t'' <- expandPath testTree $ floatPath "subtree/stub" assertBool "leaf is not a Stub" $ isNothing (findTree testTree $ floatPath "substub") assertBool "leaf is not a Stub" $ isJust (findTree t $ floatPath "substub") assertBool "leaf is not a Stub (2)" $ isJust (findTree t' $ floatPath "substub/stub") assertBool "leaf is not a Stub (3)" $ isJust (findTree t'' $ floatPath "subtree/stub") check_diffTrees = flip finally (Prelude.writeFile "foo_dir/foo_a" "a\n") $ do Prelude.writeFile "foo_dir/foo_a" "b\n" working_plain <- filter nondarcs `fmap` readPlainTree "." working <- updateIndex =<< updateIndexFrom "_darcs/index" darcsTreeHash working_plain pristine <- readDarcsPristine "." (working', pristine') <- diffTrees working pristine let foo_work = findFile working' (floatPath "foo_dir/foo_a") foo_pris = findFile pristine' (floatPath "foo_dir/foo_a") working' `shapeEq` pristine' @? show working' ++ " `shapeEq` " ++ show pristine' assertBool "foo_dir/foo_a is in working'" $ isJust foo_work assertBool "foo_dir/foo_a is in pristine'" $ isJust foo_pris foo_work_c <- readBlob (fromJust foo_work) foo_pris_c <- readBlob (fromJust foo_pris) BL.unpack foo_work_c @?= "b\n" BL.unpack foo_pris_c @?= "a\n" assertEqual "working' tree is minimal" 2 (length $ list working') assertEqual "pristine' tree is minimal" 2 (length $ list pristine') check_diffTrees_ident = do pristine <- readDarcsPristine "." (t1, t2) <- diffTrees pristine pristine assertBool "t1 is empty" $ null (list t1) assertBool "t2 is empty" $ null (list t2) prop_shape_eq x = no_stubs x ==> x `shapeEq` x where _types = x :: Tree Identity prop_expanded_shape_eq x = runIdentity $ expandedShapeEq x x where _types = x :: Tree Identity prop_expand_id x = no_stubs x ==> runIdentity (expand x) `shapeEq` x where _types = x :: Tree Identity prop_filter_id x = runIdentity $ expandedShapeEq x $ filter (\_ _ -> True) x where _types = x :: Tree Identity prop_filter_empty x = runIdentity $ expandedShapeEq emptyTree $ filter (\_ _ -> False) x where _types = x :: Tree Identity prop_restrict_shape_commutative (t1, t2) = no_stubs t1 && no_stubs t2 && not (restrict t1 t2 `shapeEq` emptyTree) ==> restrict t1 t2 `shapeEq` restrict t2 t1 where _types = (t1 :: Tree Identity, t2 :: Tree Identity) prop_restrict_subtree (t1, t2) = no_stubs t1 && not (restrict t1 t2 `shapeEq` emptyTree) ==> let restricted = S.fromList (map fst $ list $ restrict t1 t2) orig1 = S.fromList (map fst $ list t1) orig2 = S.fromList (map fst $ list t2) in and [restricted `S.isSubsetOf` orig1, restricted `S.isSubsetOf` orig2] where _types = (t1 :: Tree Identity, t2 :: Tree Identity) prop_overlay_shape (t1 :: Tree Identity, t2) = (Just LT == runIdentity (t2 `cmpExpandedShape` t1)) ==> runIdentity $ (t1 `overlay` t2) `expandedShapeEq` t1 prop_overlay_super (t1 :: Tree Identity, t2) = (Just LT == runIdentity (t2 `cmpExpandedShape` t1)) && no_stubs t2 ==> Just EQ == (runIdentity $ restrict t2 (t1 `overlay` t2) `cmpTree` t2) prop_expandPath (TreeWithPath t p) = notStub $ find (runIdentity $ expandPath t p) p where notStub (Just (Stub _ _)) = False notStub Nothing = error "Did not exist." notStub _ = True
9,630
tree :: [TF.Test] tree = [ testCase "modifyTree" check_modify , testCase "complex modifyTree" check_modify_complex , testCase "modifyTree removal" check_modify_remove , testCase "expand" check_expand , testCase "expandPath" check_expand_path , testCase "expandPath of sub" check_expand_path_sub , testCase "diffTrees" check_diffTrees , testCase "diffTrees identical" check_diffTrees_ident , testProperty "expandPath" prop_expandPath , testProperty "shapeEq" prop_shape_eq , testProperty "expandedShapeEq" prop_expanded_shape_eq , testProperty "expand is identity" prop_expand_id , testProperty "filter True is identity" prop_filter_id , testProperty "filter False is empty" prop_filter_empty , testProperty "restrict both ways keeps shape" prop_restrict_shape_commutative , testProperty "restrict is a subtree of both" prop_restrict_subtree , testProperty "overlay keeps shape" prop_overlay_shape , testProperty "overlay is superset of over" prop_overlay_super ] where blob x = File $ Blob (return (BL.pack x)) (sha256 $ BL.pack x) name = Name . BS.pack check_modify = let t = makeTree [(name "foo", blob "bar")] modify = modifyTree t (floatPath "foo") (Just $ blob "bla") in do x <- readBlob $ fromJust $ findFile t (floatPath "foo") y <- readBlob $ fromJust $ findFile modify (floatPath "foo") assertEqual "old version" x (BL.pack "bar") assertEqual "new version" y (BL.pack "bla") assertBool "list has foo" $ isJust (Prelude.lookup (floatPath "foo") $ list modify) length (list modify) @?= 1 check_modify_complex = let t = makeTree [ (name "foo", blob "bar") , (name "bar", SubTree t1) ] t1 = makeTree [ (name "foo", blob "bar") ] modify = modifyTree t (floatPath "bar/foo") (Just $ blob "bla") in do foo <- readBlob $ fromJust $ findFile t (floatPath "foo") foo' <- readBlob $ fromJust $ findFile modify (floatPath "foo") bar_foo <- readBlob $ fromJust $ findFile t (floatPath "bar/foo") bar_foo' <- readBlob $ fromJust $ findFile modify (floatPath "bar/foo") assertEqual "old foo" foo (BL.pack "bar") assertEqual "old bar/foo" bar_foo (BL.pack "bar") assertEqual "new foo" foo' (BL.pack "bar") assertEqual "new bar/foo" bar_foo' (BL.pack "bla") assertBool "list has bar/foo" $ isJust (Prelude.lookup (floatPath "bar/foo") $ list modify) assertBool "list has foo" $ isJust (Prelude.lookup (floatPath "foo") $ list modify) length (list modify) @?= length (list t) check_modify_remove = let t1 = makeTree [(name "foo", blob "bar")] t2 :: Tree Identity = makeTree [ (name "foo", blob "bar") , (name "bar", SubTree t1) ] modify1 = modifyTree t1 (floatPath "foo") Nothing modify2 = modifyTree t2 (floatPath "bar") Nothing file = findFile modify1 (floatPath "foo") subtree = findTree modify2 (floatPath "bar") in do assertBool "file is gone" (isNothing file) assertBool "subtree is gone" (isNothing subtree) no_stubs t = null [ () | (_, Stub _ _) <- list t ] path = floatPath "substub/substub/file" badpath = floatPath "substub/substub/foo" check_expand = do x <- expand testTree assertBool "no stubs in testTree" $ not (no_stubs testTree) assertBool "stubs in expanded tree" $ no_stubs x assertBool "path reachable" $ path `elem` (map fst $ list x) assertBool "badpath not reachable" $ badpath `notElem` (map fst $ list x) check_expand_path = do test_exp <- expand testTree t <- expandPath testTree path t' <- expandPath test_exp path t'' <- expandPath testTree $ floatPath "substub/x" assertBool "path not reachable in testTree" $ path `notElem` (map fst $ list testTree) assertBool "path reachable in t" $ path `elem` (map fst $ list t) assertBool "path reachable in t'" $ path `elem` (map fst $ list t') assertBool "path reachable in t (with findFile)" $ isJust $ findFile t path assertBool "path reachable in t' (with findFile)" $ isJust $ findFile t' path assertBool "path not reachable in t''" $ path `notElem` (map fst $ list t'') assertBool "badpath not reachable in t" $ badpath `notElem` (map fst $ list t) assertBool "badpath not reachable in t'" $ badpath `notElem` (map fst $ list t') check_expand_path_sub = do t <- expandPath testTree $ floatPath "substub" t' <- expandPath testTree $ floatPath "substub/stub" t'' <- expandPath testTree $ floatPath "subtree/stub" assertBool "leaf is not a Stub" $ isNothing (findTree testTree $ floatPath "substub") assertBool "leaf is not a Stub" $ isJust (findTree t $ floatPath "substub") assertBool "leaf is not a Stub (2)" $ isJust (findTree t' $ floatPath "substub/stub") assertBool "leaf is not a Stub (3)" $ isJust (findTree t'' $ floatPath "subtree/stub") check_diffTrees = flip finally (Prelude.writeFile "foo_dir/foo_a" "a\n") $ do Prelude.writeFile "foo_dir/foo_a" "b\n" working_plain <- filter nondarcs `fmap` readPlainTree "." working <- updateIndex =<< updateIndexFrom "_darcs/index" darcsTreeHash working_plain pristine <- readDarcsPristine "." (working', pristine') <- diffTrees working pristine let foo_work = findFile working' (floatPath "foo_dir/foo_a") foo_pris = findFile pristine' (floatPath "foo_dir/foo_a") working' `shapeEq` pristine' @? show working' ++ " `shapeEq` " ++ show pristine' assertBool "foo_dir/foo_a is in working'" $ isJust foo_work assertBool "foo_dir/foo_a is in pristine'" $ isJust foo_pris foo_work_c <- readBlob (fromJust foo_work) foo_pris_c <- readBlob (fromJust foo_pris) BL.unpack foo_work_c @?= "b\n" BL.unpack foo_pris_c @?= "a\n" assertEqual "working' tree is minimal" 2 (length $ list working') assertEqual "pristine' tree is minimal" 2 (length $ list pristine') check_diffTrees_ident = do pristine <- readDarcsPristine "." (t1, t2) <- diffTrees pristine pristine assertBool "t1 is empty" $ null (list t1) assertBool "t2 is empty" $ null (list t2) prop_shape_eq x = no_stubs x ==> x `shapeEq` x where _types = x :: Tree Identity prop_expanded_shape_eq x = runIdentity $ expandedShapeEq x x where _types = x :: Tree Identity prop_expand_id x = no_stubs x ==> runIdentity (expand x) `shapeEq` x where _types = x :: Tree Identity prop_filter_id x = runIdentity $ expandedShapeEq x $ filter (\_ _ -> True) x where _types = x :: Tree Identity prop_filter_empty x = runIdentity $ expandedShapeEq emptyTree $ filter (\_ _ -> False) x where _types = x :: Tree Identity prop_restrict_shape_commutative (t1, t2) = no_stubs t1 && no_stubs t2 && not (restrict t1 t2 `shapeEq` emptyTree) ==> restrict t1 t2 `shapeEq` restrict t2 t1 where _types = (t1 :: Tree Identity, t2 :: Tree Identity) prop_restrict_subtree (t1, t2) = no_stubs t1 && not (restrict t1 t2 `shapeEq` emptyTree) ==> let restricted = S.fromList (map fst $ list $ restrict t1 t2) orig1 = S.fromList (map fst $ list t1) orig2 = S.fromList (map fst $ list t2) in and [restricted `S.isSubsetOf` orig1, restricted `S.isSubsetOf` orig2] where _types = (t1 :: Tree Identity, t2 :: Tree Identity) prop_overlay_shape (t1 :: Tree Identity, t2) = (Just LT == runIdentity (t2 `cmpExpandedShape` t1)) ==> runIdentity $ (t1 `overlay` t2) `expandedShapeEq` t1 prop_overlay_super (t1 :: Tree Identity, t2) = (Just LT == runIdentity (t2 `cmpExpandedShape` t1)) && no_stubs t2 ==> Just EQ == (runIdentity $ restrict t2 (t1 `overlay` t2) `cmpTree` t2) prop_expandPath (TreeWithPath t p) = notStub $ find (runIdentity $ expandPath t p) p where notStub (Just (Stub _ _)) = False notStub Nothing = error "Did not exist." notStub _ = True
9,630
tree = [ testCase "modifyTree" check_modify , testCase "complex modifyTree" check_modify_complex , testCase "modifyTree removal" check_modify_remove , testCase "expand" check_expand , testCase "expandPath" check_expand_path , testCase "expandPath of sub" check_expand_path_sub , testCase "diffTrees" check_diffTrees , testCase "diffTrees identical" check_diffTrees_ident , testProperty "expandPath" prop_expandPath , testProperty "shapeEq" prop_shape_eq , testProperty "expandedShapeEq" prop_expanded_shape_eq , testProperty "expand is identity" prop_expand_id , testProperty "filter True is identity" prop_filter_id , testProperty "filter False is empty" prop_filter_empty , testProperty "restrict both ways keeps shape" prop_restrict_shape_commutative , testProperty "restrict is a subtree of both" prop_restrict_subtree , testProperty "overlay keeps shape" prop_overlay_shape , testProperty "overlay is superset of over" prop_overlay_super ] where blob x = File $ Blob (return (BL.pack x)) (sha256 $ BL.pack x) name = Name . BS.pack check_modify = let t = makeTree [(name "foo", blob "bar")] modify = modifyTree t (floatPath "foo") (Just $ blob "bla") in do x <- readBlob $ fromJust $ findFile t (floatPath "foo") y <- readBlob $ fromJust $ findFile modify (floatPath "foo") assertEqual "old version" x (BL.pack "bar") assertEqual "new version" y (BL.pack "bla") assertBool "list has foo" $ isJust (Prelude.lookup (floatPath "foo") $ list modify) length (list modify) @?= 1 check_modify_complex = let t = makeTree [ (name "foo", blob "bar") , (name "bar", SubTree t1) ] t1 = makeTree [ (name "foo", blob "bar") ] modify = modifyTree t (floatPath "bar/foo") (Just $ blob "bla") in do foo <- readBlob $ fromJust $ findFile t (floatPath "foo") foo' <- readBlob $ fromJust $ findFile modify (floatPath "foo") bar_foo <- readBlob $ fromJust $ findFile t (floatPath "bar/foo") bar_foo' <- readBlob $ fromJust $ findFile modify (floatPath "bar/foo") assertEqual "old foo" foo (BL.pack "bar") assertEqual "old bar/foo" bar_foo (BL.pack "bar") assertEqual "new foo" foo' (BL.pack "bar") assertEqual "new bar/foo" bar_foo' (BL.pack "bla") assertBool "list has bar/foo" $ isJust (Prelude.lookup (floatPath "bar/foo") $ list modify) assertBool "list has foo" $ isJust (Prelude.lookup (floatPath "foo") $ list modify) length (list modify) @?= length (list t) check_modify_remove = let t1 = makeTree [(name "foo", blob "bar")] t2 :: Tree Identity = makeTree [ (name "foo", blob "bar") , (name "bar", SubTree t1) ] modify1 = modifyTree t1 (floatPath "foo") Nothing modify2 = modifyTree t2 (floatPath "bar") Nothing file = findFile modify1 (floatPath "foo") subtree = findTree modify2 (floatPath "bar") in do assertBool "file is gone" (isNothing file) assertBool "subtree is gone" (isNothing subtree) no_stubs t = null [ () | (_, Stub _ _) <- list t ] path = floatPath "substub/substub/file" badpath = floatPath "substub/substub/foo" check_expand = do x <- expand testTree assertBool "no stubs in testTree" $ not (no_stubs testTree) assertBool "stubs in expanded tree" $ no_stubs x assertBool "path reachable" $ path `elem` (map fst $ list x) assertBool "badpath not reachable" $ badpath `notElem` (map fst $ list x) check_expand_path = do test_exp <- expand testTree t <- expandPath testTree path t' <- expandPath test_exp path t'' <- expandPath testTree $ floatPath "substub/x" assertBool "path not reachable in testTree" $ path `notElem` (map fst $ list testTree) assertBool "path reachable in t" $ path `elem` (map fst $ list t) assertBool "path reachable in t'" $ path `elem` (map fst $ list t') assertBool "path reachable in t (with findFile)" $ isJust $ findFile t path assertBool "path reachable in t' (with findFile)" $ isJust $ findFile t' path assertBool "path not reachable in t''" $ path `notElem` (map fst $ list t'') assertBool "badpath not reachable in t" $ badpath `notElem` (map fst $ list t) assertBool "badpath not reachable in t'" $ badpath `notElem` (map fst $ list t') check_expand_path_sub = do t <- expandPath testTree $ floatPath "substub" t' <- expandPath testTree $ floatPath "substub/stub" t'' <- expandPath testTree $ floatPath "subtree/stub" assertBool "leaf is not a Stub" $ isNothing (findTree testTree $ floatPath "substub") assertBool "leaf is not a Stub" $ isJust (findTree t $ floatPath "substub") assertBool "leaf is not a Stub (2)" $ isJust (findTree t' $ floatPath "substub/stub") assertBool "leaf is not a Stub (3)" $ isJust (findTree t'' $ floatPath "subtree/stub") check_diffTrees = flip finally (Prelude.writeFile "foo_dir/foo_a" "a\n") $ do Prelude.writeFile "foo_dir/foo_a" "b\n" working_plain <- filter nondarcs `fmap` readPlainTree "." working <- updateIndex =<< updateIndexFrom "_darcs/index" darcsTreeHash working_plain pristine <- readDarcsPristine "." (working', pristine') <- diffTrees working pristine let foo_work = findFile working' (floatPath "foo_dir/foo_a") foo_pris = findFile pristine' (floatPath "foo_dir/foo_a") working' `shapeEq` pristine' @? show working' ++ " `shapeEq` " ++ show pristine' assertBool "foo_dir/foo_a is in working'" $ isJust foo_work assertBool "foo_dir/foo_a is in pristine'" $ isJust foo_pris foo_work_c <- readBlob (fromJust foo_work) foo_pris_c <- readBlob (fromJust foo_pris) BL.unpack foo_work_c @?= "b\n" BL.unpack foo_pris_c @?= "a\n" assertEqual "working' tree is minimal" 2 (length $ list working') assertEqual "pristine' tree is minimal" 2 (length $ list pristine') check_diffTrees_ident = do pristine <- readDarcsPristine "." (t1, t2) <- diffTrees pristine pristine assertBool "t1 is empty" $ null (list t1) assertBool "t2 is empty" $ null (list t2) prop_shape_eq x = no_stubs x ==> x `shapeEq` x where _types = x :: Tree Identity prop_expanded_shape_eq x = runIdentity $ expandedShapeEq x x where _types = x :: Tree Identity prop_expand_id x = no_stubs x ==> runIdentity (expand x) `shapeEq` x where _types = x :: Tree Identity prop_filter_id x = runIdentity $ expandedShapeEq x $ filter (\_ _ -> True) x where _types = x :: Tree Identity prop_filter_empty x = runIdentity $ expandedShapeEq emptyTree $ filter (\_ _ -> False) x where _types = x :: Tree Identity prop_restrict_shape_commutative (t1, t2) = no_stubs t1 && no_stubs t2 && not (restrict t1 t2 `shapeEq` emptyTree) ==> restrict t1 t2 `shapeEq` restrict t2 t1 where _types = (t1 :: Tree Identity, t2 :: Tree Identity) prop_restrict_subtree (t1, t2) = no_stubs t1 && not (restrict t1 t2 `shapeEq` emptyTree) ==> let restricted = S.fromList (map fst $ list $ restrict t1 t2) orig1 = S.fromList (map fst $ list t1) orig2 = S.fromList (map fst $ list t2) in and [restricted `S.isSubsetOf` orig1, restricted `S.isSubsetOf` orig2] where _types = (t1 :: Tree Identity, t2 :: Tree Identity) prop_overlay_shape (t1 :: Tree Identity, t2) = (Just LT == runIdentity (t2 `cmpExpandedShape` t1)) ==> runIdentity $ (t1 `overlay` t2) `expandedShapeEq` t1 prop_overlay_super (t1 :: Tree Identity, t2) = (Just LT == runIdentity (t2 `cmpExpandedShape` t1)) && no_stubs t2 ==> Just EQ == (runIdentity $ restrict t2 (t1 `overlay` t2) `cmpTree` t2) prop_expandPath (TreeWithPath t p) = notStub $ find (runIdentity $ expandPath t p) p where notStub (Just (Stub _ _)) = False notStub Nothing = error "Did not exist." notStub _ = True
9,612
false
true
15
15
3,454
2,634
1,251
1,383
null
null
rahulmutt/ghcvm
compiler/Eta/Prelude/PrimOp.hs
bsd-3-clause
tagOf_PrimOp CopyMutableArrayOp = _ILIT(149)
44
tagOf_PrimOp CopyMutableArrayOp = _ILIT(149)
44
tagOf_PrimOp CopyMutableArrayOp = _ILIT(149)
44
false
false
0
6
3
15
7
8
null
null
andrey013/pluginstest
Plugins/Gallery/Gallery/Manual58.hs
mit
d = centerX (t ||| s ||| o ||| c)
33
d = centerX (t ||| s ||| o ||| c)
33
d = centerX (t ||| s ||| o ||| c)
33
false
false
1
9
9
27
12
15
null
null
peteg/ADHOC
Tests/08_Kesterel/003_pause.hs
gpl-2.0
e4 = unitA >>> nothingE >>> arr (\() -> ((), ())) >>> pauseE *** (pauseE >>> nothingE)
86
e4 = unitA >>> nothingE >>> arr (\() -> ((), ())) >>> pauseE *** (pauseE >>> nothingE)
86
e4 = unitA >>> nothingE >>> arr (\() -> ((), ())) >>> pauseE *** (pauseE >>> nothingE)
86
false
false
0
12
16
52
28
24
null
null
CindyLinz/Haskell.js
trans/src/Desugar/CaseReorder.hs
mit
deCaseReorderLiteral a1 (PrimString l string1 string2) = PrimString (id l) (id string1) (id string2)
100
deCaseReorderLiteral a1 (PrimString l string1 string2) = PrimString (id l) (id string1) (id string2)
100
deCaseReorderLiteral a1 (PrimString l string1 string2) = PrimString (id l) (id string1) (id string2)
100
false
false
0
7
13
46
22
24
null
null
SamirTalwar/advent-of-code
2016/AOC_17_2.hs
mit
directions = [U, D, L, R]
25
directions = [U, D, L, R]
25
directions = [U, D, L, R]
25
false
false
1
5
5
21
11
10
null
null
master-q/carettah
src/Carettah/Render.hs
gpl-3.0
truePosition :: Double -> Double -> (CPosition, CPosition) -> (Double, Double) truePosition fsize _ (CPosition x', CPosition y') = (x', y' + fsize)
147
truePosition :: Double -> Double -> (CPosition, CPosition) -> (Double, Double) truePosition fsize _ (CPosition x', CPosition y') = (x', y' + fsize)
147
truePosition fsize _ (CPosition x', CPosition y') = (x', y' + fsize)
68
false
true
0
11
22
70
36
34
null
null
mikeizbicki/dominion
src/Dominion/Cards.hs
bsd-3-clause
harbinger :: Card harbinger = defCard { cardAction = \cs gs -> do gs <- actionDrawCards 1 cs gs gs <- actionAddActions 1 cs gs gs <- MaybeT $ return $ actionDiscardToDeck cs gs return gs , cardCost = 3 , cardName = "harbinger" , cardType = defCardType { action = True } } where actionDiscardToDeck :: ActionParams -> GameState -> Maybe GameState actionDiscardToDeck (APList [ ]) gs = Just gs actionDiscardToDeck (APList [c]) gs = updatePlayerStateM CurrentPlayer discard2deck gs where discard2deck ps = case find (==c) $ discard ps of Nothing -> Nothing Just _ -> Just $ ps { discard = delete c $ discard ps , deck = c : deck ps } actionDiscardToDeck _ _ = Nothing
897
harbinger :: Card harbinger = defCard { cardAction = \cs gs -> do gs <- actionDrawCards 1 cs gs gs <- actionAddActions 1 cs gs gs <- MaybeT $ return $ actionDiscardToDeck cs gs return gs , cardCost = 3 , cardName = "harbinger" , cardType = defCardType { action = True } } where actionDiscardToDeck :: ActionParams -> GameState -> Maybe GameState actionDiscardToDeck (APList [ ]) gs = Just gs actionDiscardToDeck (APList [c]) gs = updatePlayerStateM CurrentPlayer discard2deck gs where discard2deck ps = case find (==c) $ discard ps of Nothing -> Nothing Just _ -> Just $ ps { discard = delete c $ discard ps , deck = c : deck ps } actionDiscardToDeck _ _ = Nothing
897
harbinger = defCard { cardAction = \cs gs -> do gs <- actionDrawCards 1 cs gs gs <- actionAddActions 1 cs gs gs <- MaybeT $ return $ actionDiscardToDeck cs gs return gs , cardCost = 3 , cardName = "harbinger" , cardType = defCardType { action = True } } where actionDiscardToDeck :: ActionParams -> GameState -> Maybe GameState actionDiscardToDeck (APList [ ]) gs = Just gs actionDiscardToDeck (APList [c]) gs = updatePlayerStateM CurrentPlayer discard2deck gs where discard2deck ps = case find (==c) $ discard ps of Nothing -> Nothing Just _ -> Just $ ps { discard = delete c $ discard ps , deck = c : deck ps } actionDiscardToDeck _ _ = Nothing
879
false
true
5
14
353
255
130
125
null
null
hyPiRion/hs-playground
fun-to-imp/src/Main.hs
unlicense
catted :: [FStmt] catted = [FAssign "x" (FFilter (FFilter (FIdent "lst") "z" (FCall "eq" [FCall "len" [FIdent "z"], FCall "len" [FIdent "lst"]])) "w" (FCall "greater" [FCall "len" [FIdent "w"], FInt 10]))]
386
catted :: [FStmt] catted = [FAssign "x" (FFilter (FFilter (FIdent "lst") "z" (FCall "eq" [FCall "len" [FIdent "z"], FCall "len" [FIdent "lst"]])) "w" (FCall "greater" [FCall "len" [FIdent "w"], FInt 10]))]
386
catted = [FAssign "x" (FFilter (FFilter (FIdent "lst") "z" (FCall "eq" [FCall "len" [FIdent "z"], FCall "len" [FIdent "lst"]])) "w" (FCall "greater" [FCall "len" [FIdent "w"], FInt 10]))]
368
false
true
0
17
211
119
58
61
null
null
nushio3/ghc
compiler/stranal/DmdAnal.hs
bsd-3-clause
findBndrsDmds :: AnalEnv -> DmdType -> [Var] -> (DmdType, [Demand]) -- Return the demands on the Ids in the [Var] findBndrsDmds env dmd_ty bndrs = go dmd_ty bndrs where go dmd_ty [] = (dmd_ty, []) go dmd_ty (b:bs) | isId b = let (dmd_ty1, dmds) = go dmd_ty bs (dmd_ty2, dmd) = findBndrDmd env False dmd_ty1 b in (dmd_ty2, dmd : dmds) | otherwise = go dmd_ty bs
433
findBndrsDmds :: AnalEnv -> DmdType -> [Var] -> (DmdType, [Demand]) findBndrsDmds env dmd_ty bndrs = go dmd_ty bndrs where go dmd_ty [] = (dmd_ty, []) go dmd_ty (b:bs) | isId b = let (dmd_ty1, dmds) = go dmd_ty bs (dmd_ty2, dmd) = findBndrDmd env False dmd_ty1 b in (dmd_ty2, dmd : dmds) | otherwise = go dmd_ty bs
387
findBndrsDmds env dmd_ty bndrs = go dmd_ty bndrs where go dmd_ty [] = (dmd_ty, []) go dmd_ty (b:bs) | isId b = let (dmd_ty1, dmds) = go dmd_ty bs (dmd_ty2, dmd) = findBndrDmd env False dmd_ty1 b in (dmd_ty2, dmd : dmds) | otherwise = go dmd_ty bs
319
true
true
1
10
140
179
86
93
null
null
TomMD/ghc
compiler/prelude/PrelNames.hs
bsd-3-clause
dATA_ARRAY_PARALLEL_PRIM_NAME = mkModuleNameFS (fsLit "Data.Array.Parallel.Prim")
81
dATA_ARRAY_PARALLEL_PRIM_NAME = mkModuleNameFS (fsLit "Data.Array.Parallel.Prim")
81
dATA_ARRAY_PARALLEL_PRIM_NAME = mkModuleNameFS (fsLit "Data.Array.Parallel.Prim")
81
false
false
0
7
4
15
7
8
null
null
yairchu/hmm
src/Numeric/HMM/Internal.hs
bsd-3-clause
algoH :: (Unboxed prob, Num prob) => Direction -> AlgoMode prob -> Hmm state obs prob -> [obs] -> (prob, Int -> Int -> prob) algoH dir mode hmm observations = (score, getVal) where getVal layer node = resultArr ! ((layerArrIdxs ! layer) + node) layers = map (hmmStatesForObservation hmm) observations numLayers = length layers layerArrIdxs :: UArray Int Int layerArrIdxs = listArray (0, numLayers - 1) . scanl (+) 0 . map hmmLayerSize $ init layers arrSize = sum $ map hmmLayerSize layers nodeWeight st obser True = algoAdd mode (nodeWeight st obser False) (algoVal mode (hmmStartProbs hmm) st) nodeWeight st obser False = algoVal mode (hmmObservationProbs hmm st) obser algoOrder = case dir of Forwards -> id Backwards -> reverse ordLayers = algoOrder layers ordObs = algoOrder observations ordLayerIdxs = algoOrder [0 .. numLayers - 1] startLayer = head ordLayers startLayerIdx = head ordLayerIdxs normalizeLayer arr layer layerIdx = do let idxs = map (+ (layerArrIdxs ! layerIdx)) [0 .. hmmLayerSize layer - 1] tot <- foldl1L (algoAdd mode) . joinM . fmap (readSTUArray arr) . listTfromList $ idxs let mult = algoInverse mode tot normalize i = modifySTUArray arr i $ algoMult mode mult forM_ idxs normalize let r = algoToLog mode tot r `seq` return r startLayerVal i = case dir of Forwards -> 1 Backwards -> nodeWeight (hmmLayerStates startLayer i) (head ordObs) False backwardsLayer arr (layerIdxP, layerIdxN, obsP, _, layerP, layerN) = forM_ [0 .. hmmLayerSize layerP] $ \iP -> let stateP = hmmLayerStates layerP iP incoming = joinM . fmap proc . listTfromList . hmmLayerTransitionsFromPrev layerN $ stateP proc iN = fmap ( algoMult mode . algoVal mode (hmmTransitionProbs hmm stateP) $ hmmLayerStates layerN iN ) $ readSTUArray arr (arrIdxN + iN) in writeSTUArray arr (arrIdxP + iP) . algoMult mode (nodeWeight stateP obsP (layerIdxP == 0)) =<< foldl1L (algoAdd mode) incoming where arrIdxP = layerArrIdxs ! layerIdxP arrIdxN = layerArrIdxs ! layerIdxN forwardsLayer arr (layerIdxN, layerIdxP, _, obsP, layerN, layerP) = do let arrIdxN = layerArrIdxs ! layerIdxN arrIdxP = layerArrIdxs ! layerIdxP forM_ [0 .. hmmLayerSize layerN - 1] $ \iN -> writeSTUArray arr (arrIdxN + iN) (algoZero mode) forM_ [0 .. hmmLayerSize layerP - 1] $ \iP -> do valP <- readSTUArray arr (arrIdxP + iP) let stateP = hmmLayerStates layerP iP valPInc = algoMult mode valP $ nodeWeight stateP obsP (layerIdxP == 0) forM_ (hmmLayerTransitionsFromPrev layerN stateP) $ \iN -> let valToAdd = algoMult mode valPInc . algoVal mode (hmmTransitionProbs hmm stateP) $ hmmLayerStates layerN iN in modifySTUArray arr (arrIdxN + iN) $ algoAdd mode valToAdd (score, resultArr) = runST $ do arr <- newSTUArrayDef (0, arrSize - 1) forM_ [0 .. hmmLayerSize startLayer - 1] $ \i -> writeSTUArray arr ((layerArrIdxs ! startLayerIdx) + i) $ startLayerVal i scoreRef <- newSTRef =<< normalizeLayer arr startLayer startLayerIdx forM_ (getZipList $ (,,,,,) <$> ZipList (tail ordLayerIdxs) <*> ZipList ordLayerIdxs <*> ZipList (tail ordObs) <*> ZipList ordObs <*> ZipList (tail ordLayers) <*> ZipList ordLayers ) $ \args@(layerIdx, _, _, _, layer, _) -> do case dir of Forwards -> forwardsLayer arr args Backwards -> backwardsLayer arr args layerNorm <- normalizeLayer arr layer layerIdx prevScore <- readSTRef scoreRef let newScore = prevScore + layerNorm newScore `seq` writeSTRef scoreRef newScore rScore <- readSTRef scoreRef rArr <- unsafeFreezeSTU arr return (rScore, rArr)
4,351
algoH :: (Unboxed prob, Num prob) => Direction -> AlgoMode prob -> Hmm state obs prob -> [obs] -> (prob, Int -> Int -> prob) algoH dir mode hmm observations = (score, getVal) where getVal layer node = resultArr ! ((layerArrIdxs ! layer) + node) layers = map (hmmStatesForObservation hmm) observations numLayers = length layers layerArrIdxs :: UArray Int Int layerArrIdxs = listArray (0, numLayers - 1) . scanl (+) 0 . map hmmLayerSize $ init layers arrSize = sum $ map hmmLayerSize layers nodeWeight st obser True = algoAdd mode (nodeWeight st obser False) (algoVal mode (hmmStartProbs hmm) st) nodeWeight st obser False = algoVal mode (hmmObservationProbs hmm st) obser algoOrder = case dir of Forwards -> id Backwards -> reverse ordLayers = algoOrder layers ordObs = algoOrder observations ordLayerIdxs = algoOrder [0 .. numLayers - 1] startLayer = head ordLayers startLayerIdx = head ordLayerIdxs normalizeLayer arr layer layerIdx = do let idxs = map (+ (layerArrIdxs ! layerIdx)) [0 .. hmmLayerSize layer - 1] tot <- foldl1L (algoAdd mode) . joinM . fmap (readSTUArray arr) . listTfromList $ idxs let mult = algoInverse mode tot normalize i = modifySTUArray arr i $ algoMult mode mult forM_ idxs normalize let r = algoToLog mode tot r `seq` return r startLayerVal i = case dir of Forwards -> 1 Backwards -> nodeWeight (hmmLayerStates startLayer i) (head ordObs) False backwardsLayer arr (layerIdxP, layerIdxN, obsP, _, layerP, layerN) = forM_ [0 .. hmmLayerSize layerP] $ \iP -> let stateP = hmmLayerStates layerP iP incoming = joinM . fmap proc . listTfromList . hmmLayerTransitionsFromPrev layerN $ stateP proc iN = fmap ( algoMult mode . algoVal mode (hmmTransitionProbs hmm stateP) $ hmmLayerStates layerN iN ) $ readSTUArray arr (arrIdxN + iN) in writeSTUArray arr (arrIdxP + iP) . algoMult mode (nodeWeight stateP obsP (layerIdxP == 0)) =<< foldl1L (algoAdd mode) incoming where arrIdxP = layerArrIdxs ! layerIdxP arrIdxN = layerArrIdxs ! layerIdxN forwardsLayer arr (layerIdxN, layerIdxP, _, obsP, layerN, layerP) = do let arrIdxN = layerArrIdxs ! layerIdxN arrIdxP = layerArrIdxs ! layerIdxP forM_ [0 .. hmmLayerSize layerN - 1] $ \iN -> writeSTUArray arr (arrIdxN + iN) (algoZero mode) forM_ [0 .. hmmLayerSize layerP - 1] $ \iP -> do valP <- readSTUArray arr (arrIdxP + iP) let stateP = hmmLayerStates layerP iP valPInc = algoMult mode valP $ nodeWeight stateP obsP (layerIdxP == 0) forM_ (hmmLayerTransitionsFromPrev layerN stateP) $ \iN -> let valToAdd = algoMult mode valPInc . algoVal mode (hmmTransitionProbs hmm stateP) $ hmmLayerStates layerN iN in modifySTUArray arr (arrIdxN + iN) $ algoAdd mode valToAdd (score, resultArr) = runST $ do arr <- newSTUArrayDef (0, arrSize - 1) forM_ [0 .. hmmLayerSize startLayer - 1] $ \i -> writeSTUArray arr ((layerArrIdxs ! startLayerIdx) + i) $ startLayerVal i scoreRef <- newSTRef =<< normalizeLayer arr startLayer startLayerIdx forM_ (getZipList $ (,,,,,) <$> ZipList (tail ordLayerIdxs) <*> ZipList ordLayerIdxs <*> ZipList (tail ordObs) <*> ZipList ordObs <*> ZipList (tail ordLayers) <*> ZipList ordLayers ) $ \args@(layerIdx, _, _, _, layer, _) -> do case dir of Forwards -> forwardsLayer arr args Backwards -> backwardsLayer arr args layerNorm <- normalizeLayer arr layer layerIdx prevScore <- readSTRef scoreRef let newScore = prevScore + layerNorm newScore `seq` writeSTRef scoreRef newScore rScore <- readSTRef scoreRef rArr <- unsafeFreezeSTU arr return (rScore, rArr)
4,351
algoH dir mode hmm observations = (score, getVal) where getVal layer node = resultArr ! ((layerArrIdxs ! layer) + node) layers = map (hmmStatesForObservation hmm) observations numLayers = length layers layerArrIdxs :: UArray Int Int layerArrIdxs = listArray (0, numLayers - 1) . scanl (+) 0 . map hmmLayerSize $ init layers arrSize = sum $ map hmmLayerSize layers nodeWeight st obser True = algoAdd mode (nodeWeight st obser False) (algoVal mode (hmmStartProbs hmm) st) nodeWeight st obser False = algoVal mode (hmmObservationProbs hmm st) obser algoOrder = case dir of Forwards -> id Backwards -> reverse ordLayers = algoOrder layers ordObs = algoOrder observations ordLayerIdxs = algoOrder [0 .. numLayers - 1] startLayer = head ordLayers startLayerIdx = head ordLayerIdxs normalizeLayer arr layer layerIdx = do let idxs = map (+ (layerArrIdxs ! layerIdx)) [0 .. hmmLayerSize layer - 1] tot <- foldl1L (algoAdd mode) . joinM . fmap (readSTUArray arr) . listTfromList $ idxs let mult = algoInverse mode tot normalize i = modifySTUArray arr i $ algoMult mode mult forM_ idxs normalize let r = algoToLog mode tot r `seq` return r startLayerVal i = case dir of Forwards -> 1 Backwards -> nodeWeight (hmmLayerStates startLayer i) (head ordObs) False backwardsLayer arr (layerIdxP, layerIdxN, obsP, _, layerP, layerN) = forM_ [0 .. hmmLayerSize layerP] $ \iP -> let stateP = hmmLayerStates layerP iP incoming = joinM . fmap proc . listTfromList . hmmLayerTransitionsFromPrev layerN $ stateP proc iN = fmap ( algoMult mode . algoVal mode (hmmTransitionProbs hmm stateP) $ hmmLayerStates layerN iN ) $ readSTUArray arr (arrIdxN + iN) in writeSTUArray arr (arrIdxP + iP) . algoMult mode (nodeWeight stateP obsP (layerIdxP == 0)) =<< foldl1L (algoAdd mode) incoming where arrIdxP = layerArrIdxs ! layerIdxP arrIdxN = layerArrIdxs ! layerIdxN forwardsLayer arr (layerIdxN, layerIdxP, _, obsP, layerN, layerP) = do let arrIdxN = layerArrIdxs ! layerIdxN arrIdxP = layerArrIdxs ! layerIdxP forM_ [0 .. hmmLayerSize layerN - 1] $ \iN -> writeSTUArray arr (arrIdxN + iN) (algoZero mode) forM_ [0 .. hmmLayerSize layerP - 1] $ \iP -> do valP <- readSTUArray arr (arrIdxP + iP) let stateP = hmmLayerStates layerP iP valPInc = algoMult mode valP $ nodeWeight stateP obsP (layerIdxP == 0) forM_ (hmmLayerTransitionsFromPrev layerN stateP) $ \iN -> let valToAdd = algoMult mode valPInc . algoVal mode (hmmTransitionProbs hmm stateP) $ hmmLayerStates layerN iN in modifySTUArray arr (arrIdxN + iN) $ algoAdd mode valToAdd (score, resultArr) = runST $ do arr <- newSTUArrayDef (0, arrSize - 1) forM_ [0 .. hmmLayerSize startLayer - 1] $ \i -> writeSTUArray arr ((layerArrIdxs ! startLayerIdx) + i) $ startLayerVal i scoreRef <- newSTRef =<< normalizeLayer arr startLayer startLayerIdx forM_ (getZipList $ (,,,,,) <$> ZipList (tail ordLayerIdxs) <*> ZipList ordLayerIdxs <*> ZipList (tail ordObs) <*> ZipList ordObs <*> ZipList (tail ordLayers) <*> ZipList ordLayers ) $ \args@(layerIdx, _, _, _, layer, _) -> do case dir of Forwards -> forwardsLayer arr args Backwards -> backwardsLayer arr args layerNorm <- normalizeLayer arr layer layerIdx prevScore <- readSTRef scoreRef let newScore = prevScore + layerNorm newScore `seq` writeSTRef scoreRef newScore rScore <- readSTRef scoreRef rArr <- unsafeFreezeSTU arr return (rScore, rArr)
4,220
false
true
123
15
1,458
1,318
689
629
null
null
yihuang/wai-sockjs
Main.hs
bsd-3-clause
staticApp :: Application staticApp = Static.staticApp Static.defaultFileServerSettings { Static.ssFolder = Static.embeddedLookup $ Static.toEmbedded $(embedDir "static") }
185
staticApp :: Application staticApp = Static.staticApp Static.defaultFileServerSettings { Static.ssFolder = Static.embeddedLookup $ Static.toEmbedded $(embedDir "static") }
185
staticApp = Static.staticApp Static.defaultFileServerSettings { Static.ssFolder = Static.embeddedLookup $ Static.toEmbedded $(embedDir "static") }
160
false
true
0
12
29
46
23
23
null
null
vincenthz/language-c
src/Language/C/Analysis/AstAnalysis.hs
bsd-3-clause
tExpr' c _ (CUnary CCompOp e ni) = do t <- tExpr c RValue e checkIntegral' ni t return t
103
tExpr' c _ (CUnary CCompOp e ni) = do t <- tExpr c RValue e checkIntegral' ni t return t
103
tExpr' c _ (CUnary CCompOp e ni) = do t <- tExpr c RValue e checkIntegral' ni t return t
103
false
false
0
8
34
51
22
29
null
null
kovach/ecstatic
Development/Ecstatic/Size.hs
bsd-2-clause
sizeOfType g (ArrayType ty (ArraySize _ expr) _ _) = sizeOfType g ty * expr
75
sizeOfType g (ArrayType ty (ArraySize _ expr) _ _) = sizeOfType g ty * expr
75
sizeOfType g (ArrayType ty (ArraySize _ expr) _ _) = sizeOfType g ty * expr
75
false
false
0
9
14
40
19
21
null
null
gcampax/ghc
compiler/hsSyn/HsExpr.hs
bsd-3-clause
ppr_expr (HsArrApp arrow arg _ HsFirstOrderApp False) = hsep [ppr_lexpr arg, arrowt, ppr_lexpr arrow]
103
ppr_expr (HsArrApp arrow arg _ HsFirstOrderApp False) = hsep [ppr_lexpr arg, arrowt, ppr_lexpr arrow]
103
ppr_expr (HsArrApp arrow arg _ HsFirstOrderApp False) = hsep [ppr_lexpr arg, arrowt, ppr_lexpr arrow]
103
false
false
0
7
15
41
20
21
null
null
mzini/tct-homepage
src/Main.hs
bsd-3-clause
parentIdField = field "parent-id" (return . takeDirectory . toFilePath . itemIdentifier)
88
parentIdField = field "parent-id" (return . takeDirectory . toFilePath . itemIdentifier)
88
parentIdField = field "parent-id" (return . takeDirectory . toFilePath . itemIdentifier)
88
false
false
0
9
10
26
13
13
null
null
alios/lambda-devs
Data/DEVS/Simulation/Simulator.hs
bsd-3-clause
waitOnZero :: Integral i => MSemN i -> IO a -> IO a waitOnZero sem = MSemN.with sem 1
85
waitOnZero :: Integral i => MSemN i -> IO a -> IO a waitOnZero sem = MSemN.with sem 1
85
waitOnZero sem = MSemN.with sem 1
33
false
true
0
8
18
45
20
25
null
null
qpliu/esolang
DGOL/hs/compiler/CodeGen/CodeGen.hs
gpl-3.0
declareExtern :: [String] -> (String,String) -> ModuleBuilder () declareExtern libs (mod,rout) | elem mod libs = return () | otherwise = do extern (fromString (mod ++ "." ++ rout)) [pFrameType] void return ()
228
declareExtern :: [String] -> (String,String) -> ModuleBuilder () declareExtern libs (mod,rout) | elem mod libs = return () | otherwise = do extern (fromString (mod ++ "." ++ rout)) [pFrameType] void return ()
228
declareExtern libs (mod,rout) | elem mod libs = return () | otherwise = do extern (fromString (mod ++ "." ++ rout)) [pFrameType] void return ()
163
false
true
1
13
52
106
52
54
null
null
philopon/arib
src/Data/Arib/PESPSI/Internal.hs
bsd-3-clause
concatTsPackets :: Monad m => Conduit TS m (Either TS (PESPSI L.ByteString)) concatTsPackets = concatTsPackets' (yield . Left) (yield . Right)
142
concatTsPackets :: Monad m => Conduit TS m (Either TS (PESPSI L.ByteString)) concatTsPackets = concatTsPackets' (yield . Left) (yield . Right)
142
concatTsPackets = concatTsPackets' (yield . Left) (yield . Right)
65
false
true
0
11
20
60
30
30
null
null
brendanhay/gogol
gogol-cloudiot/gen/Network/Google/Resource/CloudIOT/Projects/Locations/Registries/Groups/BindDeviceToGateway.hs
mpl-2.0
-- | Upload protocol for media (e.g. \"raw\", \"multipart\"). plrgbdtgUploadProtocol :: Lens' ProjectsLocationsRegistriesGroupsBindDeviceToGateway (Maybe Text) plrgbdtgUploadProtocol = lens _plrgbdtgUploadProtocol (\ s a -> s{_plrgbdtgUploadProtocol = a})
263
plrgbdtgUploadProtocol :: Lens' ProjectsLocationsRegistriesGroupsBindDeviceToGateway (Maybe Text) plrgbdtgUploadProtocol = lens _plrgbdtgUploadProtocol (\ s a -> s{_plrgbdtgUploadProtocol = a})
201
plrgbdtgUploadProtocol = lens _plrgbdtgUploadProtocol (\ s a -> s{_plrgbdtgUploadProtocol = a})
103
true
true
0
8
33
49
25
24
null
null
silky/csound-expression
src/Csound/Air/ModArg.hs
bsd-3-clause
-- delayed white noise delNoiseArg1 :: (ModArg1 (SE Sig) b) => D -> D -> Sig -> b -> ModArgOut1 (SE Sig) b delNoiseArg1 delTime riseTime depth f = delModArg1 delTime riseTime depth white f
189
delNoiseArg1 :: (ModArg1 (SE Sig) b) => D -> D -> Sig -> b -> ModArgOut1 (SE Sig) b delNoiseArg1 delTime riseTime depth f = delModArg1 delTime riseTime depth white f
165
delNoiseArg1 delTime riseTime depth f = delModArg1 delTime riseTime depth white f
81
true
true
0
12
35
76
38
38
null
null
mrshannon/trees
src/Graphics.hs
gpl-2.0
applyProjection :: Window -> View -> IO () applyProjection = GL.applyProjection
79
applyProjection :: Window -> View -> IO () applyProjection = GL.applyProjection
79
applyProjection = GL.applyProjection
36
false
true
0
8
10
26
13
13
null
null
adarqui/99problems-hs
Experimentation/P07.hs
gpl-3.0
flatten_rec :: [[a]] -> [a] flatten_rec [] = []
47
flatten_rec :: [[a]] -> [a] flatten_rec [] = []
47
flatten_rec [] = []
19
false
true
0
7
8
31
17
14
null
null
ezyang/ghc
compiler/utils/Bag.hs
bsd-3-clause
filterBagM pred (ListBag vs) = do sat <- filterM pred vs return (listToBag sat)
83
filterBagM pred (ListBag vs) = do sat <- filterM pred vs return (listToBag sat)
83
filterBagM pred (ListBag vs) = do sat <- filterM pred vs return (listToBag sat)
83
false
false
0
9
17
41
18
23
null
null
mgold/Elm
src/Type/Constrain/Expression.hs
bsd-3-clause
constrain :: Env.Environment -> Canonical.Expr -> Type -> IO TypeConstraint constrain env annotatedExpr@(A.A region expression) tipe = let list t = Env.getType env "List" <| t in case expression of E.Literal lit -> Literal.constrain env region lit tipe E.Cmd _ -> return CTrue E.Sub _ -> return CTrue E.OutgoingPort _ _ -> return CTrue E.IncomingPort _ _ -> return CTrue E.Program _ _ -> error "DANGER - Program AST nodes should not be in type inference." E.SaveEnv moduleName effects -> Effects.constrain env moduleName effects E.GLShader _uid _src gltipe -> exists $ \attr -> exists $ \unif -> let shaderTipe a u v = Env.getType env "WebGL.Shader" <| a <| u <| v glToType glTipe = Env.getType env (Lit.glTipeName glTipe) makeRec accessor baseRec = let decls = accessor gltipe in if Map.size decls == 0 then baseRec else record (Map.map glToType decls) baseRec attribute = makeRec Lit.attribute attr uniform = makeRec Lit.uniform unif varying = makeRec Lit.varying (TermN EmptyRecord1) in return (CEqual Error.Shader region (shaderTipe attribute uniform varying) tipe) E.Var var -> return (CInstance region (V.toString var) tipe) E.Range lowExpr highExpr -> existsNumber $ \n -> do lowCon <- constrain env lowExpr n highCon <- constrain env highExpr n return $ CAnd [ lowCon , highCon , CEqual Error.Range region (list n) tipe ] E.ExplicitList exprs -> constrainList env region exprs tipe E.Binop op leftExpr rightExpr -> constrainBinop env region op leftExpr rightExpr tipe E.Lambda pattern body -> exists $ \argType -> exists $ \resType -> do fragment <- Pattern.constrain env pattern argType bodyCon <- constrain env body resType let con = ex (Fragment.vars fragment) (CLet [monoscheme (Fragment.typeEnv fragment)] (Fragment.typeConstraint fragment /\ bodyCon) ) return $ con /\ CEqual Error.Lambda region (argType ==> resType) tipe E.App _ _ -> let (f:args) = E.collectApps annotatedExpr in constrainApp env region f args tipe E.If branches finally -> constrainIf env region branches finally tipe E.Case expr branches -> constrainCase env region expr branches tipe E.Data name exprs -> do vars <- Monad.forM exprs $ \_ -> mkVar Nothing let pairs = zip exprs (map VarN vars) (ctipe, cs) <- Monad.foldM step (tipe, CTrue) (reverse pairs) return $ ex vars (cs /\ CInstance region name ctipe) where step (t,c) (e,x) = do c' <- constrain env e x return (x ==> t, c /\ c') E.Access expr label -> exists $ \t -> constrain env expr (record (Map.singleton label tipe) t) E.Update expr fields -> exists $ \t -> do oldVars <- mapM (\_ -> mkVar Nothing) fields let oldFields = Map.fromList (zip (map fst fields) (map VarN oldVars)) cOld <- ex oldVars <$> constrain env expr (record oldFields t) newVars <- mapM (\_ -> mkVar Nothing) fields let newFields = Map.fromList (zip (map fst fields) (map VarN newVars)) let cNew = CEqual Error.Record region (record newFields t) tipe cs <- Monad.zipWithM (constrain env) (map snd fields) (map VarN newVars) return $ cOld /\ ex newVars (CAnd (cNew : cs)) E.Record fields -> do vars <- Monad.forM fields (\_ -> mkVar Nothing) fieldCons <- Monad.zipWithM (constrain env) (map snd fields) (map VarN vars) let fields' = Map.fromList (zip (map fst fields) (map VarN vars)) let recordType = record fields' (TermN EmptyRecord1) return (ex vars (CAnd (fieldCons ++ [CEqual Error.Record region recordType tipe]))) E.Let defs body -> do bodyCon <- constrain env body tipe (Info schemes rqs fqs headers c2 c1) <- Monad.foldM (constrainDef env) (Info [] [] [] Map.empty CTrue CTrue) (concatMap expandPattern defs) let letScheme = [ Scheme rqs fqs (CLet [monoscheme headers] c2) headers ] return $ CLet schemes (CLet letScheme (c1 /\ bodyCon)) -- CONSTRAIN APP
4,809
constrain :: Env.Environment -> Canonical.Expr -> Type -> IO TypeConstraint constrain env annotatedExpr@(A.A region expression) tipe = let list t = Env.getType env "List" <| t in case expression of E.Literal lit -> Literal.constrain env region lit tipe E.Cmd _ -> return CTrue E.Sub _ -> return CTrue E.OutgoingPort _ _ -> return CTrue E.IncomingPort _ _ -> return CTrue E.Program _ _ -> error "DANGER - Program AST nodes should not be in type inference." E.SaveEnv moduleName effects -> Effects.constrain env moduleName effects E.GLShader _uid _src gltipe -> exists $ \attr -> exists $ \unif -> let shaderTipe a u v = Env.getType env "WebGL.Shader" <| a <| u <| v glToType glTipe = Env.getType env (Lit.glTipeName glTipe) makeRec accessor baseRec = let decls = accessor gltipe in if Map.size decls == 0 then baseRec else record (Map.map glToType decls) baseRec attribute = makeRec Lit.attribute attr uniform = makeRec Lit.uniform unif varying = makeRec Lit.varying (TermN EmptyRecord1) in return (CEqual Error.Shader region (shaderTipe attribute uniform varying) tipe) E.Var var -> return (CInstance region (V.toString var) tipe) E.Range lowExpr highExpr -> existsNumber $ \n -> do lowCon <- constrain env lowExpr n highCon <- constrain env highExpr n return $ CAnd [ lowCon , highCon , CEqual Error.Range region (list n) tipe ] E.ExplicitList exprs -> constrainList env region exprs tipe E.Binop op leftExpr rightExpr -> constrainBinop env region op leftExpr rightExpr tipe E.Lambda pattern body -> exists $ \argType -> exists $ \resType -> do fragment <- Pattern.constrain env pattern argType bodyCon <- constrain env body resType let con = ex (Fragment.vars fragment) (CLet [monoscheme (Fragment.typeEnv fragment)] (Fragment.typeConstraint fragment /\ bodyCon) ) return $ con /\ CEqual Error.Lambda region (argType ==> resType) tipe E.App _ _ -> let (f:args) = E.collectApps annotatedExpr in constrainApp env region f args tipe E.If branches finally -> constrainIf env region branches finally tipe E.Case expr branches -> constrainCase env region expr branches tipe E.Data name exprs -> do vars <- Monad.forM exprs $ \_ -> mkVar Nothing let pairs = zip exprs (map VarN vars) (ctipe, cs) <- Monad.foldM step (tipe, CTrue) (reverse pairs) return $ ex vars (cs /\ CInstance region name ctipe) where step (t,c) (e,x) = do c' <- constrain env e x return (x ==> t, c /\ c') E.Access expr label -> exists $ \t -> constrain env expr (record (Map.singleton label tipe) t) E.Update expr fields -> exists $ \t -> do oldVars <- mapM (\_ -> mkVar Nothing) fields let oldFields = Map.fromList (zip (map fst fields) (map VarN oldVars)) cOld <- ex oldVars <$> constrain env expr (record oldFields t) newVars <- mapM (\_ -> mkVar Nothing) fields let newFields = Map.fromList (zip (map fst fields) (map VarN newVars)) let cNew = CEqual Error.Record region (record newFields t) tipe cs <- Monad.zipWithM (constrain env) (map snd fields) (map VarN newVars) return $ cOld /\ ex newVars (CAnd (cNew : cs)) E.Record fields -> do vars <- Monad.forM fields (\_ -> mkVar Nothing) fieldCons <- Monad.zipWithM (constrain env) (map snd fields) (map VarN vars) let fields' = Map.fromList (zip (map fst fields) (map VarN vars)) let recordType = record fields' (TermN EmptyRecord1) return (ex vars (CAnd (fieldCons ++ [CEqual Error.Record region recordType tipe]))) E.Let defs body -> do bodyCon <- constrain env body tipe (Info schemes rqs fqs headers c2 c1) <- Monad.foldM (constrainDef env) (Info [] [] [] Map.empty CTrue CTrue) (concatMap expandPattern defs) let letScheme = [ Scheme rqs fqs (CLet [monoscheme headers] c2) headers ] return $ CLet schemes (CLet letScheme (c1 /\ bodyCon)) -- CONSTRAIN APP
4,809
constrain env annotatedExpr@(A.A region expression) tipe = let list t = Env.getType env "List" <| t in case expression of E.Literal lit -> Literal.constrain env region lit tipe E.Cmd _ -> return CTrue E.Sub _ -> return CTrue E.OutgoingPort _ _ -> return CTrue E.IncomingPort _ _ -> return CTrue E.Program _ _ -> error "DANGER - Program AST nodes should not be in type inference." E.SaveEnv moduleName effects -> Effects.constrain env moduleName effects E.GLShader _uid _src gltipe -> exists $ \attr -> exists $ \unif -> let shaderTipe a u v = Env.getType env "WebGL.Shader" <| a <| u <| v glToType glTipe = Env.getType env (Lit.glTipeName glTipe) makeRec accessor baseRec = let decls = accessor gltipe in if Map.size decls == 0 then baseRec else record (Map.map glToType decls) baseRec attribute = makeRec Lit.attribute attr uniform = makeRec Lit.uniform unif varying = makeRec Lit.varying (TermN EmptyRecord1) in return (CEqual Error.Shader region (shaderTipe attribute uniform varying) tipe) E.Var var -> return (CInstance region (V.toString var) tipe) E.Range lowExpr highExpr -> existsNumber $ \n -> do lowCon <- constrain env lowExpr n highCon <- constrain env highExpr n return $ CAnd [ lowCon , highCon , CEqual Error.Range region (list n) tipe ] E.ExplicitList exprs -> constrainList env region exprs tipe E.Binop op leftExpr rightExpr -> constrainBinop env region op leftExpr rightExpr tipe E.Lambda pattern body -> exists $ \argType -> exists $ \resType -> do fragment <- Pattern.constrain env pattern argType bodyCon <- constrain env body resType let con = ex (Fragment.vars fragment) (CLet [monoscheme (Fragment.typeEnv fragment)] (Fragment.typeConstraint fragment /\ bodyCon) ) return $ con /\ CEqual Error.Lambda region (argType ==> resType) tipe E.App _ _ -> let (f:args) = E.collectApps annotatedExpr in constrainApp env region f args tipe E.If branches finally -> constrainIf env region branches finally tipe E.Case expr branches -> constrainCase env region expr branches tipe E.Data name exprs -> do vars <- Monad.forM exprs $ \_ -> mkVar Nothing let pairs = zip exprs (map VarN vars) (ctipe, cs) <- Monad.foldM step (tipe, CTrue) (reverse pairs) return $ ex vars (cs /\ CInstance region name ctipe) where step (t,c) (e,x) = do c' <- constrain env e x return (x ==> t, c /\ c') E.Access expr label -> exists $ \t -> constrain env expr (record (Map.singleton label tipe) t) E.Update expr fields -> exists $ \t -> do oldVars <- mapM (\_ -> mkVar Nothing) fields let oldFields = Map.fromList (zip (map fst fields) (map VarN oldVars)) cOld <- ex oldVars <$> constrain env expr (record oldFields t) newVars <- mapM (\_ -> mkVar Nothing) fields let newFields = Map.fromList (zip (map fst fields) (map VarN newVars)) let cNew = CEqual Error.Record region (record newFields t) tipe cs <- Monad.zipWithM (constrain env) (map snd fields) (map VarN newVars) return $ cOld /\ ex newVars (CAnd (cNew : cs)) E.Record fields -> do vars <- Monad.forM fields (\_ -> mkVar Nothing) fieldCons <- Monad.zipWithM (constrain env) (map snd fields) (map VarN vars) let fields' = Map.fromList (zip (map fst fields) (map VarN vars)) let recordType = record fields' (TermN EmptyRecord1) return (ex vars (CAnd (fieldCons ++ [CEqual Error.Record region recordType tipe]))) E.Let defs body -> do bodyCon <- constrain env body tipe (Info schemes rqs fqs headers c2 c1) <- Monad.foldM (constrainDef env) (Info [] [] [] Map.empty CTrue CTrue) (concatMap expandPattern defs) let letScheme = [ Scheme rqs fqs (CLet [monoscheme headers] c2) headers ] return $ CLet schemes (CLet letScheme (c1 /\ bodyCon)) -- CONSTRAIN APP
4,717
false
true
0
26
1,722
1,650
785
865
null
null
rudyl313/factual-haskell-driver
test/Tests.hs
bsd-3-clause
rawIntegrationTest :: Token -> Test rawIntegrationTest token = TestCase (do result <- get (Options { token = token, timeout = Nothing }) "/t/places" (M.fromList [("q", "starbucks")]) assertEqual "Valid read query" "ok" (status result))
239
rawIntegrationTest :: Token -> Test rawIntegrationTest token = TestCase (do result <- get (Options { token = token, timeout = Nothing }) "/t/places" (M.fromList [("q", "starbucks")]) assertEqual "Valid read query" "ok" (status result))
239
rawIntegrationTest token = TestCase (do result <- get (Options { token = token, timeout = Nothing }) "/t/places" (M.fromList [("q", "starbucks")]) assertEqual "Valid read query" "ok" (status result))
203
false
true
0
14
36
88
46
42
null
null
ajnsit/react-flux
src/React/Flux/DOM.hs
bsd-3-clause
hr_ :: [PropertyOrHandler eventHandler] -> ReactElementM eventHandler (); hr_ p = el "hr" p mempty
98
hr_ :: [PropertyOrHandler eventHandler] -> ReactElementM eventHandler () hr_ p = el "hr" p mempty
97
hr_ p = el "hr" p mempty
24
false
true
0
7
14
39
19
20
null
null
comonoidial/ALFIN
ExtCore/Pretty.hs
mit
ppKind' Kunlifted = char '#'
28
ppKind' Kunlifted = char '#'
28
ppKind' Kunlifted = char '#'
28
false
false
0
5
4
12
5
7
null
null
balangs/eTeak
src/TeakScript.hs
bsd-3-clause
tsBadArg :: TSVRecordClass record => String -> String -> TSValue record -> TSValue record tsBadArg name expecting arg = TSVError $ "bad argument `" ++ show arg ++ "' to function `" ++ name ++ "' expecting " ++ expecting
231
tsBadArg :: TSVRecordClass record => String -> String -> TSValue record -> TSValue record tsBadArg name expecting arg = TSVError $ "bad argument `" ++ show arg ++ "' to function `" ++ name ++ "' expecting " ++ expecting
227
tsBadArg name expecting arg = TSVError $ "bad argument `" ++ show arg ++ "' to function `" ++ name ++ "' expecting " ++ expecting
137
false
true
2
9
51
76
34
42
null
null
vTurbine/ghc
compiler/basicTypes/DataCon.hs
bsd-3-clause
-- | Was this tycon promotable before GHC 8.0? That is, is it promotable -- without -XTypeInType isLegacyPromotableTyCon :: TyCon -> Bool isLegacyPromotableTyCon tc = isVanillaAlgTyCon tc || -- This returns True more often than it should, but it's quite painful -- to make this fully accurate. And no harm is caused; we just don't -- require -XTypeInType every time we need to. (We'll always require -- -XDataKinds, though, so there's no standards-compliance issue.) isFunTyCon tc || isKindTyCon tc
528
isLegacyPromotableTyCon :: TyCon -> Bool isLegacyPromotableTyCon tc = isVanillaAlgTyCon tc || -- This returns True more often than it should, but it's quite painful -- to make this fully accurate. And no harm is caused; we just don't -- require -XTypeInType every time we need to. (We'll always require -- -XDataKinds, though, so there's no standards-compliance issue.) isFunTyCon tc || isKindTyCon tc
431
isLegacyPromotableTyCon tc = isVanillaAlgTyCon tc || -- This returns True more often than it should, but it's quite painful -- to make this fully accurate. And no harm is caused; we just don't -- require -XTypeInType every time we need to. (We'll always require -- -XDataKinds, though, so there's no standards-compliance issue.) isFunTyCon tc || isKindTyCon tc
390
true
true
0
7
108
41
22
19
null
null
ksaveljev/hake-2
src/Constants.hs
bsd-3-clause
fLstring = 2 :: Int
22
fLstring = 2 :: Int
22
fLstring = 2 :: Int
22
false
false
0
4
7
9
5
4
null
null
arnizamani/occam
Parsing.hs
mit
-- merge the two HsDecl, one as lhs and one as rhs mergeHsDecl :: HsDecl -> HsDecl -> (HsExp,HsExp) mergeHsDecl (HsPatBind _ _ (HsUnGuardedRhs (HsApp (HsVar (UnQual name)) pat)) _) (HsPatBind _ _ (HsUnGuardedRhs exp) _) -- = normalDec $ HsFunBind [HsMatch (SrcLoc "" 0 0) name [expToPat pat] (HsUnGuardedRhs exp) []] = ((HsApp (HsVar (UnQual name)) pat), exp)
367
mergeHsDecl :: HsDecl -> HsDecl -> (HsExp,HsExp) mergeHsDecl (HsPatBind _ _ (HsUnGuardedRhs (HsApp (HsVar (UnQual name)) pat)) _) (HsPatBind _ _ (HsUnGuardedRhs exp) _) -- = normalDec $ HsFunBind [HsMatch (SrcLoc "" 0 0) name [expToPat pat] (HsUnGuardedRhs exp) []] = ((HsApp (HsVar (UnQual name)) pat), exp)
316
mergeHsDecl (HsPatBind _ _ (HsUnGuardedRhs (HsApp (HsVar (UnQual name)) pat)) _) (HsPatBind _ _ (HsUnGuardedRhs exp) _) -- = normalDec $ HsFunBind [HsMatch (SrcLoc "" 0 0) name [expToPat pat] (HsUnGuardedRhs exp) []] = ((HsApp (HsVar (UnQual name)) pat), exp)
267
true
true
0
15
66
114
60
54
null
null
verement/etamoo
src/MOO/List.hs
bsd-3-clause
toList :: MOOList -> [Value] toList = V.toList . toVector
57
toList :: MOOList -> [Value] toList = V.toList . toVector
57
toList = V.toList . toVector
28
false
true
0
6
9
24
13
11
null
null
DanielWaterworth/Idris-dev
src/Idris/AbsSyntaxTree.hs
bsd-3-clause
tldeclared (PClass _ _ _ _ n _ _ ms) = concatMap tldeclared ms
62
tldeclared (PClass _ _ _ _ n _ _ ms) = concatMap tldeclared ms
62
tldeclared (PClass _ _ _ _ n _ _ ms) = concatMap tldeclared ms
62
false
false
0
6
13
35
16
19
null
null
pjones/themoviedb
test/TestHelper.hs
mit
fileRequest :: FilePath -> RequestFunction fileRequest path _ _ = Right <$> readFileLBS path
92
fileRequest :: FilePath -> RequestFunction fileRequest path _ _ = Right <$> readFileLBS path
92
fileRequest path _ _ = Right <$> readFileLBS path
49
false
true
0
6
13
29
14
15
null
null
aaronc/Idris-dev
src/Idris/AbsSyntaxTree.hs
bsd-3-clause
mapPDeclFC f g (PRunElabDecl fc script ns) = PRunElabDecl (f fc) (mapPTermFC f g script) ns
95
mapPDeclFC f g (PRunElabDecl fc script ns) = PRunElabDecl (f fc) (mapPTermFC f g script) ns
95
mapPDeclFC f g (PRunElabDecl fc script ns) = PRunElabDecl (f fc) (mapPTermFC f g script) ns
95
false
false
0
7
19
46
22
24
null
null
bhamrick/RouteNeo
Pokemon/Species.hs
bsd-3-clause
allSpecies :: [Species] allSpecies = [ Species { _name = "Bulbasaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 49 , _baseDef = 49 , _baseSpd = 45 , _baseSpc = 65 , _killExp = 64 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (7, "Leech Seed") , (13, "Vine Whip") , (20, "Poisonpowder") , (27, "Razor Leaf") , (34, "Growth") , (41, "Sleep Powder") , (48, "Solarbeam") ] } , Species { _name = "Ivysaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 62 , _baseDef = 63 , _baseSpd = 60 , _baseSpc = 80 , _killExp = 141 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (0, "Leech Seed") , (7, "Leech Seed") , (13, "Vine Whip") , (22, "Poisonpowder") , (30, "Razor Leaf") , (38, "Growth") , (46, "Sleep Powder") , (54, "Solarbeam") ] } , Species { _name = "Venusaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 82 , _baseDef = 83 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 208 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (0, "Leech Seed") , (0, "Vine Whip") , (7, "Leech Seed") , (13, "Vine Whip") , (22, "Poisonpowder") , (30, "Razor Leaf") , (43, "Growth") , (55, "Sleep Powder") , (65, "Solarbeam") ] } , Species { _name = "Charmander" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Nothing , _baseHP = 39 , _baseAtk = 52 , _baseDef = 43 , _baseSpd = 65 , _baseSpc = 50 , _killExp = 65 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (9, "Ember") , (15, "Leer") , (22, "Rage") , (30, "Slash") , (38, "Flamethrower") , (46, "Fire Spin") ] } , Species { _name = "Charmeleon" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Nothing , _baseHP = 58 , _baseAtk = 64 , _baseDef = 58 , _baseSpd = 80 , _baseSpc = 65 , _killExp = 142 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Ember") , (9, "Ember") , (15, "Leer") , (24, "Rage") , (33, "Slash") , (42, "Flamethrower") , (56, "Fire Spin") ] } , Species { _name = "Charizard" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Just Flying , _baseHP = 78 , _baseAtk = 84 , _baseDef = 78 , _baseSpd = 100 , _baseSpc = 85 , _killExp = 209 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Ember") , (0, "Leer") , (9, "Ember") , (15, "Leer") , (24, "Rage") , (36, "Slash") , (46, "Flamethrower") , (55, "Fire Spin") ] } , Species { _name = "Squirtle" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 44 , _baseAtk = 48 , _baseDef = 65 , _baseSpd = 43 , _baseSpc = 50 , _killExp = 66 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (8, "Bubble") , (15, "Water Gun") , (22, "Bite") , (28, "Withdraw") , (35, "Skull Bash") , (42, "Hydro Pump") ] } , Species { _name = "Wartortle" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 59 , _baseAtk = 63 , _baseDef = 80 , _baseSpd = 58 , _baseSpc = 65 , _killExp = 143 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Bubble") , (8, "Bubble") , (15, "Water Gun") , (24, "Bite") , (31, "Withdraw") , (39, "Skull Bash") , (47, "Hydro Pump") ] } , Species { _name = "Blastoise" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 79 , _baseAtk = 83 , _baseDef = 100 , _baseSpd = 78 , _baseSpc = 85 , _killExp = 210 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Bubble") , (0, "Water Gun") , (8, "Bubble") , (15, "Water Gun") , (24, "Bite") , (31, "Withdraw") , (42, "Skull Bash") , (52, "Hydro Pump") ] } , Species { _name = "Caterpie" , _expCurve = Medium , _type1 = Bug , _type2 = Nothing , _baseHP = 45 , _baseAtk = 30 , _baseDef = 35 , _baseSpd = 45 , _baseSpc = 20 , _killExp = 53 , _learnset = mkLearnset [ (0, "Tackle") , (0, "String Shot") ] } , Species { _name = "Metapod" , _expCurve = Medium , _type1 = Bug , _type2 = Nothing , _baseHP = 50 , _baseAtk = 20 , _baseDef = 55 , _baseSpd = 30 , _baseSpc = 25 , _killExp = 72 , _learnset = mkLearnset [ (0, "Harden") ] } , Species { _name = "Butterfree" , _expCurve = Medium , _type1 = Bug , _type2 = Just Flying , _baseHP = 60 , _baseAtk = 45 , _baseDef = 50 , _baseSpd = 70 , _baseSpc = 80 , _killExp = 160 , _learnset = mkLearnset [ (0, "Confusion") , (12, "Confusion") , (15, "Poisonpowder") , (16, "Stun Spore") , (17, "Sleep Powder") , (21, "Supersonic") , (26, "Whirlwind") , (32, "Psybeam") ] } , Species { _name = "Weedle" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 40 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 50 , _baseSpc = 20 , _killExp = 52 , _learnset = mkLearnset [ (0, "Poison Sting") , (0, "String Shot") ] } , Species { _name = "Kakuna" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 25 , _baseDef = 50 , _baseSpd = 35 , _baseSpc = 25 , _killExp = 71 , _learnset = mkLearnset [ (0, "Harden") ] } , Species { _name = "Beedrill" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 65 , _baseAtk = 80 , _baseDef = 40 , _baseSpd = 75 , _baseSpc = 45 , _killExp = 159 , _learnset = mkLearnset [ (0, "Fury Attack") , (12, "Fury Attack") , (16, "Focus Energy") , (20, "Twineedle") , (25, "Rage") , (30, "Pin Missile") , (35, "Agility") ] } , Species { _name = "Pidgey" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 45 , _baseDef = 40 , _baseSpd = 56 , _baseSpc = 35 , _killExp = 55 , _learnset = mkLearnset [ (0, "Gust") , (5, "Sand Attack") , (12, "Quick Attack") , (19, "Whirlwind") , (28, "Wing Attack") , (36, "Agility") , (44, "Mirror Move") ] } , Species { _name = "Pidgeotto" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 63 , _baseAtk = 60 , _baseDef = 55 , _baseSpd = 71 , _baseSpc = 50 , _killExp = 113 , _learnset = mkLearnset [ (0, "Gust") , (0, "Sand Attack") , (5, "Sand Attack") , (12, "Quick Attack") , (21, "Whirlwind") , (31, "Wing Attack") , (40, "Agility") , (49, "Mirror Move") ] } , Species { _name = "Pidgeot" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 83 , _baseAtk = 80 , _baseDef = 75 , _baseSpd = 91 , _baseSpc = 70 , _killExp = 172 , _learnset = mkLearnset [ (0, "Gust") , (0, "Sand Attack") , (0, "Quick Attack") , (5, "Sand Attack") , (12, "Quick Attack") , (21, "Whirlwind") , (31, "Wing Attack") , (44, "Agility") , (54, "Mirror Move") ] } , Species { _name = "Rattata" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 30 , _baseAtk = 56 , _baseDef = 35 , _baseSpd = 72 , _baseSpc = 25 , _killExp = 57 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (7, "Quick Attack") , (14, "Hyper Fang") , (23, "Focus Energy") , (34, "Super Fang") ] } , Species { _name = "Raticate" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 55 , _baseAtk = 81 , _baseDef = 60 , _baseSpd = 97 , _baseSpc = 50 , _killExp = 116 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Quick Attack") , (7, "Quick Attack") , (14, "Hyper Fang") , (27, "Focus Energy") , (41, "Super Fang")] } , Species { _name = "Spearow" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 60 , _baseDef = 30 , _baseSpd = 70 , _baseSpc = 31 , _killExp = 58 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (9, "Leer") , (15, "Fury Attack") , (22, "Mirror Move") , (29, "Drill Peck") , (36, "Agility") ] } , Species { _name = "Fearow" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 65 , _baseAtk = 90 , _baseDef = 65 , _baseSpd = 100 , _baseSpc = 61 , _killExp = 162 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (0, "Leer") , (9, "Leer") , (15, "Fury Attack") , (25, "Mirror Move") , (34, "Drill Peck") , (43, "Agility") ] } , Species { _name = "Ekans" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 35 , _baseAtk = 60 , _baseDef = 44 , _baseSpd = 55 , _baseSpc = 40 , _killExp = 62 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (10, "Poison Sting") , (17, "Bite") , (24, "Glare") , (31, "Screech") , (38, "Acid") ] } , Species { _name = "Arbok" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 60 , _baseAtk = 85 , _baseDef = 69 , _baseSpd = 80 , _baseSpc = 65 , _killExp = 147 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Poison Sting") , (10, "Poison Sting") , (17, "Bite") , (27, "Glare") , (36, "Screech") , (47, "Acid") ] } , Species { _name = "Pikachu" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 35 , _baseAtk = 55 , _baseDef = 30 , _baseSpd = 90 , _baseSpc = 50 , _killExp = 82 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Growl") , (9, "Thunder Wave") , (16, "Quick Attack") , (26, "Swift") , (33, "Agility") , (43, "Thunder") ] } , Species { _name = "Raichu" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 60 , _baseAtk = 90 , _baseDef = 55 , _baseSpd = 100 , _baseSpc = 90 , _killExp = 122 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Growl") , (0, "Thunder Wave") ] } , Species { _name = "Sandshrew" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 50 , _baseAtk = 75 , _baseDef = 85 , _baseSpd = 40 , _baseSpc = 30 , _killExp = 93 , _learnset = mkLearnset [ (0, "Scratch") , (10, "Sand Attack") , (17, "Slash") , (24, "Poison Sting") , (31, "Swift") , (38, "Fury Swipes") ] } , Species { _name = "Sandslash" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 75 , _baseAtk = 100 , _baseDef = 110 , _baseSpd = 65 , _baseSpc = 55 , _killExp = 163 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Sand Attack") , (10, "Sand Attack") , (17, "Slash") , (27, "Poison Sting") , (36, "Swift") , (47, "Fury Swipes") ] } , Species { _name = "NidoranF" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 55 , _baseAtk = 47 , _baseDef = 52 , _baseSpd = 41 , _baseSpc = 40 , _killExp = 59 , _learnset = mkLearnset [ (0, "Growl") , (0, "Tackle") , (8, "Scratch") , (14, "Poison Sting") , (21, "Tail Whip") , (29, "Bite") , (36, "Fury Swipes") , (43, "Double Kick") ] } , Species { _name = "Nidorina" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 70 , _baseAtk = 62 , _baseDef = 67 , _baseSpd = 56 , _baseSpc = 55 , _killExp = 117 , _learnset = mkLearnset [ (0, "Growl") , (0, "Tackle") , (0, "Scratch") , (8, "Scratch") , (14, "Poison Sting") , (23, "Tail Whip") , (32, "Bite") , (41, "Fury Swipes") , (50, "Double Kick") ] } , Species { _name = "Nidoqueen" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Just Ground , _baseHP = 90 , _baseAtk = 82 , _baseDef = 87 , _baseSpd = 76 , _baseSpc = 75 , _killExp = 194 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Scratch") , (0, "Tail Whip") , (0, "Body Slam") , (8, "Scratch") , (14, "Poison Sting") , (23, "Body Slam") ] } , Species { _name = "NidoranM" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 46 , _baseAtk = 57 , _baseDef = 40 , _baseSpd = 50 , _baseSpc = 40 , _killExp = 60 , _learnset = mkLearnset [ (0, "Leer") , (0, "Tackle") , (8, "Horn Attack") , (14, "Poison Sting") , (21, "Focus Energy") , (29, "Fury Attack") , (36, "Horn Drill") , (43, "Double Kick") ] } , Species { _name = "Nidorino" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 61 , _baseAtk = 72 , _baseDef = 57 , _baseSpd = 65 , _baseSpc = 55 , _killExp = 118 , _learnset = mkLearnset [ (0, "Leer") , (0, "Tackle") , (0, "Horn Attack") , (8, "Horn Attack") , (14, "Poison Sting") , (23, "Focus Energy") , (32, "Fury Attack") , (41, "Horn Drill") , (50, "Double Kick") ] } , Species { _name = "Nidoking" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Just Ground , _baseHP = 81 , _baseAtk = 92 , _baseDef = 77 , _baseSpd = 85 , _baseSpc = 75 , _killExp = 195 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Horn Attack") , (0, "Poison Sting") , (0, "Thrash") , (8, "Horn Attack") , (14, "Poison Sting") , (23, "Thrash") ] } , Species { _name = "Clefairy" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 70 , _baseAtk = 45 , _baseDef = 48 , _baseSpd = 35 , _baseSpc = 60 , _killExp = 68 , _learnset = mkLearnset [ (0, "Pound") , (0, "Growl") , (13, "Sing") , (18, "Doubleslap") , (24, "Minimize") , (31, "Metronome") , (39, "Defense Curl") , (48, "Light Screen") ] } , Species { _name = "Clefable" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 95 , _baseAtk = 70 , _baseDef = 73 , _baseSpd = 60 , _baseSpc = 85 , _killExp = 129 , _learnset = mkLearnset [ (0, "Sing") , (0, "Doubleslap") , (0, "Minimize") , (0, "Metronome") ] } , Species { _name = "Vulpix" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 38 , _baseAtk = 41 , _baseDef = 40 , _baseSpd = 65 , _baseSpc = 65 , _killExp = 63 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (16, "Quick Attack") , (21, "Roar") , (28, "Confuse Ray") , (35, "Flamethrower") , (42, "Fire Spin") ] } , Species { _name = "Ninetales" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 73 , _baseAtk = 76 , _baseDef = 75 , _baseSpd = 100 , _baseSpc = 100 , _killExp = 178 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (0, "Quick Attack") , (0, "Roar") ] } , Species { _name = "Jigglypuff" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 115 , _baseAtk = 45 , _baseDef = 20 , _baseSpd = 20 , _baseSpc = 25 , _killExp = 76 , _learnset = mkLearnset [ (0, "Sing") , (9, "Pound") , (14, "Disable") , (19, "Defense Curl") , (24, "Doubleslap") , (29, "Rest") , (34, "Body Slam") , (39, "Double Edge") ] } , Species { _name = "Wigglytuff" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 140 , _baseAtk = 70 , _baseDef = 45 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 109 , _learnset = mkLearnset [ (0, "Sing") , (0, "Disable") , (0, "Defense Curl") , (0, "Doubleslap") ] } , Species { _name = "Zubat" , _expCurve = Medium , _type1 = Poison , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 45 , _baseDef = 35 , _baseSpd = 55 , _baseSpc = 40 , _killExp = 54 , _learnset = mkLearnset [ (0, "Leech Life") , (10, "Supersonic") , (15, "Bite") , (21, "Confuse Ray") , (28, "Wing Attack") , (36, "Haze") ] } , Species { _name = "Golbat" , _expCurve = Medium , _type1 = Poison , _type2 = Just Flying , _baseHP = 75 , _baseAtk = 80 , _baseDef = 70 , _baseSpd = 90 , _baseSpc = 75 , _killExp = 171 , _learnset = mkLearnset [ (0, "Leech Life") , (0, "Screech") , (0, "Bite") , (10, "Supersonic") , (15, "Bite") , (21, "Confuse Ray") , (32, "Wing Attack") , (43, "Haze") ] } , Species { _name = "Oddish" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 50 , _baseDef = 55 , _baseSpd = 30 , _baseSpc = 75 , _killExp = 78 , _learnset = mkLearnset [ (0, "Absorb") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") , (24, "Acid") , (33, "Petal Dance") , (46, "Solarbeam") ] } , Species { _name = "Gloom" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 65 , _baseDef = 70 , _baseSpd = 40 , _baseSpc = 85 , _killExp = 132 , _learnset = mkLearnset [ (0, "Absorb") , (0, "Poisonpowder") , (0, "Stun Spore") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") , (28, "Acid") , (38, "Petal Dance") , (52, "Solarbeam") ] } , Species { _name = "Vileplume" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 75 , _baseAtk = 80 , _baseDef = 85 , _baseSpd = 50 , _baseSpc = 100 , _killExp = 184 , _learnset = mkLearnset [ (0, "Stun Spore") , (0, "Sleep Powder") , (0, "Acid") , (0, "Petal Dance") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") ] } , Species { _name = "Paras" , _expCurve = Medium , _type1 = Bug , _type2 = Just Grass , _baseHP = 35 , _baseAtk = 70 , _baseDef = 55 , _baseSpd = 25 , _baseSpc = 55 , _killExp = 70 , _learnset = mkLearnset [ (0, "Scratch") , (13, "Stun Spore") , (20, "Leech Life") , (27, "Spore") , (34, "Slash") , (41, "Growth") ] } , Species { _name = "Parasect" , _expCurve = Medium , _type1 = Bug , _type2 = Just Grass , _baseHP = 60 , _baseAtk = 95 , _baseDef = 80 , _baseSpd = 30 , _baseSpc = 80 , _killExp = 128 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Stun Spore") , (0, "Leech Life") , (13, "Stun Spore") , (20, "Leech Life") , (30, "Spore") , (39, "Slash") , (48, "Growth") ] } , Species { _name = "Venonat" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 55 , _baseDef = 50 , _baseSpd = 45 , _baseSpc = 40 , _killExp = 75 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Disable") , (24, "Poisonpowder") , (27, "Leech Life") , (30, "Stun Spore") , (35, "Psybeam") , (38, "Sleep Powder") , (43, "Psychic") ] } , Species { _name = "Venomoth" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 70 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 90 , _baseSpc = 90 , _killExp = 138 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Disable") , (0, "Poisonpowder") , (0, "Leech Life") , (24, "Poisonpowder") , (27, "Leech Life") , (30, "Stun Spore") , (38, "Psybeam") , (43, "Sleep Powder") , (50, "Psychic") ] } , Species { _name = "Diglett" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 10 , _baseAtk = 55 , _baseDef = 25 , _baseSpd = 95 , _baseSpc = 45 , _killExp = 81 , _learnset = mkLearnset [ (0, "Scratch") , (15, "Growl") , (19, "Dig") , (24, "Sand Attack") , (31, "Slash") , (40, "Earthquake") ] } , Species { _name = "Dugtrio" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 35 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 120 , _baseSpc = 70 , _killExp = 153 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Dig") , (15, "Growl") , (19, "Dig") , (24, "Sand Attack") , (35, "Slash") , (47, "Earthquake") ] } , Species { _name = "Meowth" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 40 , _baseAtk = 45 , _baseDef = 35 , _baseSpd = 90 , _baseSpc = 45 , _killExp = 69 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (12, "Bite") , (17, "Pay Day") , (24, "Screech") , (33, "Fury Swipes") , (44, "Slash") ] } , Species { _name = "Persian" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 65 , _baseAtk = 70 , _baseDef = 60 , _baseSpd = 115 , _baseSpc = 65 , _killExp = 148 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Bite") , (0, "Screech") , (12, "Bite") , (17, "Pay Day") , (24, "Screech") , (37, "Fury Swipes") , (51, "Slash") ] } , Species { _name = "Psyduck" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 50 , _baseAtk = 52 , _baseDef = 48 , _baseSpd = 55 , _baseSpc = 50 , _killExp = 80 , _learnset = mkLearnset [ (0, "Scratch") , (28, "Tail Whip") , (31, "Disable") , (36, "Confusion") , (43, "Fury Swipes") , (52, "Hydro Pump") ] } , Species { _name = "Golduck" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 80 , _baseAtk = 82 , _baseDef = 78 , _baseSpd = 85 , _baseSpc = 80 , _killExp = 174 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Tail Whip") , (0, "Disable") , (28, "Tail Whip") , (31, "Disable") , (39, "Confusion") , (48, "Fury Swipes") , (59, "Hydro Pump") ] } , Species { _name = "Mankey" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 40 , _baseAtk = 80 , _baseDef = 35 , _baseSpd = 70 , _baseSpc = 35 , _killExp = 74 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Leer") , (15, "Karate Chop") , (21, "Fury Swipes") , (27, "Focus Energy") , (33, "Seismic Toss") , (39, "Thrash") ] } , Species { _name = "Primeape" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 65 , _baseAtk = 105 , _baseDef = 60 , _baseSpd = 95 , _baseSpc = 60 , _killExp = 149 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Leer") , (0, "Karate Chop") , (0, "Fury Swipes") , (15, "Karate Chop") , (21, "Fury Swipes") , (27, "Focus Energy") , (37, "Seismic Toss") , (46, "Thrash") ] } , Species { _name = "Growlithe" , _expCurve = Slow , _type1 = Fire , _type2 = Nothing , _baseHP = 55 , _baseAtk = 70 , _baseDef = 45 , _baseSpd = 60 , _baseSpc = 50 , _killExp = 91 , _learnset = mkLearnset [ (0, "Bite") , (0, "Roar") , (18, "Ember") , (23, "Leer") , (30, "Take Down") , (39, "Agility") , (50, "Flamethrower") ] } , Species { _name = "Arcanine" , _expCurve = Slow , _type1 = Fire , _type2 = Nothing , _baseHP = 90 , _baseAtk = 110 , _baseDef = 80 , _baseSpd = 95 , _baseSpc = 80 , _killExp = 213 , _learnset = mkLearnset [ (0, "Roar") , (0, "Ember") , (0, "Leer") , (0, "Take Down") ] } , Species { _name = "Poliwag" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 40 , _baseAtk = 50 , _baseDef = 40 , _baseSpd = 90 , _baseSpc = 40 , _killExp = 77 , _learnset = mkLearnset [ (0, "Bubble") , (16, "Hypnosis") , (19, "Water Gun") , (25, "Doubleslap") , (31, "Body Slam") , (38, "Amnesia") , (45, "Hydro Pump") ] } , Species { _name = "Poliwhirl" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 65 , _baseAtk = 65 , _baseDef = 65 , _baseSpd = 90 , _baseSpc = 50 , _killExp = 131 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Hypnosis") , (0, "Water Gun") , (16, "Hypnosis") , (19, "Water Gun") , (26, "Doubleslap") , (33, "Body Slam") , (41, "Amnesia") , (49, "Hydro Pump") ] } , Species { _name = "Poliwrath" , _expCurve = MediumSlow , _type1 = Water , _type2 = Just Fighting , _baseHP = 90 , _baseAtk = 85 , _baseDef = 95 , _baseSpd = 70 , _baseSpc = 70 , _killExp = 185 , _learnset = mkLearnset [ (0, "Hypnosis") , (0, "Water Gun") , (0, "Doubleslap") , (0, "Body Slam") , (16, "Hypnosis") , (19, "Water Gun") ] } , Species { _name = "Abra" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 25 , _baseAtk = 20 , _baseDef = 15 , _baseSpd = 90 , _baseSpc = 105 , _killExp = 73 , _learnset = mkLearnset [ (0, "Teleport") ] } , Species { _name = "Kadabra" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 40 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 105 , _baseSpc = 120 , _killExp = 145 , _learnset = mkLearnset [ (0, "Teleport") , (0, "Confusion") , (0, "Disable") , (16, "Confusion") , (20, "Disable") , (27, "Psybeam") , (31, "Recover") , (38, "Psychic") , (42, "Reflect") ] } , Species { _name = "Alakazam" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 55 , _baseAtk = 50 , _baseDef = 45 , _baseSpd = 120 , _baseSpc = 135 , _killExp = 186 , _learnset = mkLearnset [ (0, "Teleport") , (0, "Confusion") , (0, "Disable") , (16, "Confusion") , (20, "Disable") , (27, "Psybeam") , (31, "Recover") , (38, "Psychic") , (42, "Reflect") ] } , Species { _name = "Machop" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 70 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 35 , _baseSpc = 35 , _killExp = 88 , _learnset = mkLearnset [ (0, "Karate Chop") , (20, "Low Kick") , (25, "Leer") , (32, "Focus Energy") , (39, "Seismic Toss") , (46, "Submission") ] } , Species { _name = "Machoke" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 80 , _baseAtk = 100 , _baseDef = 70 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 146 , _learnset = mkLearnset [ (0, "Karate Chop") , (0, "Low Kick") , (0, "Leer") , (20, "Low Kick") , (25, "Leer") , (36, "Focus Energy") , (44, "Seismic Toss") , (52, "Submission") ] } , Species { _name = "Machamp" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 90 , _baseAtk = 130 , _baseDef = 80 , _baseSpd = 55 , _baseSpc = 65 , _killExp = 193 , _learnset = mkLearnset [ (0, "Karate Chop") , (0, "Low Kick") , (0, "Leer") , (20, "Low Kick") , (25, "Leer") , (36, "Focus Energy") , (44, "Seismic Toss") , (52, "Submission") ] } , Species { _name = "Bellsprout" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 50 , _baseAtk = 75 , _baseDef = 35 , _baseSpd = 40 , _baseSpc = 70 , _killExp = 84 , _learnset = mkLearnset [ (0, "Vine Whip") , (0, "Growth") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") , (21, "Stun Spore") , (26, "Acid") , (33, "Razor Leaf") , (42, "Slam") ] } , Species { _name = "Weepinbell" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 65 , _baseAtk = 90 , _baseDef = 50 , _baseSpd = 55 , _baseSpc = 85 , _killExp = 151 , _learnset = mkLearnset [ (0, "Vine Whip") , (0, "Growth") , (0, "Wrap") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") , (23, "Stun Spore") , (29, "Acid") , (38, "Razor Leaf") , (49, "Slam") ] } , Species { _name = "Victreebel" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 105 , _baseDef = 65 , _baseSpd = 70 , _baseSpc = 100 , _killExp = 191 , _learnset = mkLearnset [ (0, "Sleep Powder") , (0, "Stun Spore") , (0, "Acid") , (0, "Razor Leaf") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") ] } , Species { _name = "Tentacool" , _expCurve = Slow , _type1 = Water , _type2 = Just Poison , _baseHP = 40 , _baseAtk = 80 , _baseDef = 100 , _baseSpd = 20 , _baseSpc = 30 , _killExp = 105 , _learnset = mkLearnset [ (0, "Acid") , (7, "Supersonic") , (13, "Wrap") , (18, "Poison Sting") , (22, "Water Gun") , (27, "Constrict") , (33, "Barrier") , (40, "Screech") , (48, "Hydro Pump") ] } , Species { _name = "Tentacruel" , _expCurve = Slow , _type1 = Water , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 70 , _baseDef = 65 , _baseSpd = 100 , _baseSpc = 120 , _killExp = 205 , _learnset = mkLearnset [ (0, "Acid") , (0, "Supersonic") , (0, "Wrap") , (7, "Supersonic") , (13, "Wrap") , (18, "Poison Sting") , (22, "Water Gun") , (27, "Constrict") , (35, "Barrier") , (43, "Screech") , (50, "Hydro Pump") ] } , Species { _name = "Geodude" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 40 , _baseAtk = 80 , _baseDef = 100 , _baseSpd = 20 , _baseSpc = 30 , _killExp = 86 , _learnset = mkLearnset [ (0, "Tackle") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (26, "Harden") , (31, "Earthquake") , (36, "Explosion") ] } , Species { _name = "Graveler" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 55 , _baseAtk = 95 , _baseDef = 115 , _baseSpd = 35 , _baseSpc = 45 , _killExp = 134 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Defense Curl") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (29, "Harden") , (36, "Earthquake") , (43, "Explosion") ] } , Species { _name = "Golem" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 80 , _baseAtk = 110 , _baseDef = 130 , _baseSpd = 45 , _baseSpc = 55 , _killExp = 177 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Defense Curl") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (29, "Harden") , (36, "Earthquake") , (43, "Explosion") ] } , Species { _name = "Ponyta" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 50 , _baseAtk = 85 , _baseDef = 55 , _baseSpd = 90 , _baseSpc = 65 , _killExp = 152 , _learnset = mkLearnset [ (0, "Ember") , (30, "Tail Whip") , (32, "Stomp") , (35, "Growl") , (39, "Fire Spin") , (43, "Take Down") , (48, "Agility") ] } , Species { _name = "Rapidash" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 100 , _baseDef = 70 , _baseSpd = 105 , _baseSpc = 80 , _killExp = 192 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (0, "Stomp") , (0, "Growl") , (30, "Tail Whip") , (32, "Stomp") , (35, "Growl") , (39, "Fire Spin") , (47, "Take Down") , (55, "Agility") ] } , Species { _name = "Slowpoke" , _expCurve = Medium , _type1 = Water , _type2 = Just Psychic , _baseHP = 90 , _baseAtk = 65 , _baseDef = 65 , _baseSpd = 15 , _baseSpc = 40 , _killExp = 99 , _learnset = mkLearnset [ (0, "Confusion") , (18, "Disable") , (22, "Headbutt") , (27, "Growl") , (33, "Water Gun") , (40, "Amnesia") , (48, "Psychic") ] } , Species { _name = "Slowbro" , _expCurve = Medium , _type1 = Water , _type2 = Just Psychic , _baseHP = 95 , _baseAtk = 75 , _baseDef = 110 , _baseSpd = 30 , _baseSpc = 80 , _killExp = 164 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Disable") , (0, "Headbutt") , (18, "Disable") , (22, "Headbutt") , (27, "Growl") , (33, "Water Gun") , (37, "Withdraw") , (44, "Amnesia") , (55, "Psychic") ] } , Species { _name = "Magnemite" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 25 , _baseAtk = 35 , _baseDef = 70 , _baseSpd = 45 , _baseSpc = 95 , _killExp = 89 , _learnset = mkLearnset [ (0, "Tackle") , (21, "Sonicboom") , (25, "Thundershock") , (29, "Supersonic") , (35, "Thunder Wave") , (41, "Swift") , (47, "Screech") ] } , Species { _name = "Magneton" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 50 , _baseAtk = 60 , _baseDef = 95 , _baseSpd = 70 , _baseSpc = 120 , _killExp = 169 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sonicboom") , (0, "Thundershock") , (21, "Sonicboom") , (25, "Thundershock") , (29, "Supersonic") , (38, "Thunder Wave") , (46, "Swift") , (54, "Screech") ] } , Species { _name = "Farfetchd" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 52 , _baseAtk = 65 , _baseDef = 55 , _baseSpd = 60 , _baseSpc = 58 , _killExp = 94 , _learnset = mkLearnset [ (0, "Peck") , (0, "Sand Attack") , (7, "Leer") , (15, "Fury Attack") , (23, "Swords Dance") , (31, "Agility") , (39, "Slash") ] } , Species { _name = "Doduo" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 35 , _baseAtk = 85 , _baseDef = 45 , _baseSpd = 75 , _baseSpc = 35 , _killExp = 96 , _learnset = mkLearnset [ (0, "Peck") , (20, "Growl") , (24, "Fury Attack") , (30, "Drill Peck") , (36, "Rage") , (40, "Tri Attack") , (44, "Agility") ] } , Species { _name = "Dodrio" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 60 , _baseAtk = 110 , _baseDef = 70 , _baseSpd = 100 , _baseSpc = 60 , _killExp = 158 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (0, "Fury Attack") , (20, "Growl") , (24, "Fury Attack") , (30, "Drill Peck") , (39, "Rage") , (45, "Tri Attack") , (51, "Agility") ] } , Species { _name = "Seel" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 65 , _baseAtk = 45 , _baseDef = 55 , _baseSpd = 45 , _baseSpc = 70 , _killExp = 100 , _learnset = mkLearnset [ (0, "Headbutt") , (30, "Growl") , (35, "Aurora Beam") , (40, "Rest") , (45, "Take Down") , (50, "Ice Beam") ] } , Species { _name = "Dewgong" , _expCurve = Medium , _type1 = Water , _type2 = Just Ice , _baseHP = 90 , _baseAtk = 70 , _baseDef = 80 , _baseSpd = 70 , _baseSpc = 95 , _killExp = 176 , _learnset = mkLearnset [ (0, "Headbutt") , (0, "Growl") , (0, "Aurora Beam") , (30, "Growl") , (35, "Aurora Beam") , (44, "Rest") , (50, "Take Down") , (56, "Ice Beam") ] } , Species { _name = "Grimer" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 80 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 25 , _baseSpc = 40 , _killExp = 90 , _learnset = mkLearnset [ (0, "Pound") , (0, "Disable") , (30, "Poison Gas") , (33, "Minimize") , (37, "Sludge") , (42, "Harden") , (48, "Screech") , (55, "Acid Armor") ] } , Species { _name = "Muk" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 105 , _baseAtk = 105 , _baseDef = 75 , _baseSpd = 50 , _baseSpc = 65 , _killExp = 157 , _learnset = mkLearnset [ (0, "Pound") , (0, "Disable") , (0, "Poison Gas") , (30, "Poison Gas") , (33, "Minimize") , (37, "Sludge") , (45, "Harden") , (53, "Screech") , (60, "Acid Armor") ] } , Species { _name = "Shellder" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 65 , _baseDef = 100 , _baseSpd = 40 , _baseSpc = 45 , _killExp = 97 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Withdraw") , (18, "Supersonic") , (23, "Clamp") , (30, "Aurora Beam") , (39, "Leer") , (50, "Ice Beam") ] } , Species { _name = "Cloyster" , _expCurve = Slow , _type1 = Water , _type2 = Just Ice , _baseHP = 50 , _baseAtk = 95 , _baseDef = 180 , _baseSpd = 70 , _baseSpc = 85 , _killExp = 203 , _learnset = mkLearnset [ (0, "Withdraw") , (0, "Supersonic") , (0, "Clamp") , (0, "Aurora Beam") , (50, "Spike Cannon") ] } , Species { _name = "Gastly" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 30 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 95 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (27, "Hypnosis") , (35, "Dream Eater") ] } , Species { _name = "Haunter" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 50 , _baseDef = 45 , _baseSpd = 95 , _baseSpc = 115 , _killExp = 126 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (29, "Hypnosis") , (38, "Dream Eater") ] } , Species { _name = "Gengar" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 110 , _baseSpc = 130 , _killExp = 190 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (29, "Hypnosis") , (38, "Dream Eater") ] } , Species { _name = "Onix" , _expCurve = Medium , _type1 = Rock , _type2 = Just Ground , _baseHP = 35 , _baseAtk = 45 , _baseDef = 160 , _baseSpd = 70 , _baseSpc = 30 , _killExp = 108 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (15, "Bind") , (19, "Rock Throw") , (25, "Rage") , (33, "Slam") , (43, "Harden") ] } , Species { _name = "Drowzee" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 60 , _baseAtk = 48 , _baseDef = 45 , _baseSpd = 42 , _baseSpc = 90 , _killExp = 102 , _learnset = mkLearnset [ (0, "Pound") , (0, "Hypnosis") , (12, "Disable") , (17, "Confusion") , (24, "Headbutt") , (29, "Poison Gas") , (32, "Psychic") , (37, "Meditate") ] } , Species { _name = "Hypno" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 85 , _baseAtk = 73 , _baseDef = 70 , _baseSpd = 67 , _baseSpc = 115 , _killExp = 165 , _learnset = mkLearnset [ (0, "Pound") , (0, "Hypnosis") , (0, "Disable") , (0, "Confusion") , (12, "Disable") , (17, "Confusion") , (24, "Headbutt") , (33, "Poison Gas") , (37, "Psychic") , (43, "Meditate") ] } , Species { _name = "Krabby" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 105 , _baseDef = 90 , _baseSpd = 50 , _baseSpc = 25 , _killExp = 115 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Leer") , (20, "Vicegrip") , (25, "Guillotine") , (30, "Stomp") , (35, "Crabhammer") , (40, "Harden") ] } , Species { _name = "Kingler" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 55 , _baseAtk = 130 , _baseDef = 115 , _baseSpd = 75 , _baseSpc = 50 , _killExp = 206 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Leer") , (0, "Vicegrip") , (20, "Vicegrip") , (25, "Guillotine") , (34, "Stomp") , (42, "Crabhammer") , (49, "Harden") ] } , Species { _name = "Voltorb" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 40 , _baseAtk = 30 , _baseDef = 50 , _baseSpd = 100 , _baseSpc = 55 , _killExp = 103 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (17, "Sonicboom") , (22, "Selfdestruct") , (29, "Light Screen") , (36, "Swift") , (43, "Explosion") ] } , Species { _name = "Electrode" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 60 , _baseAtk = 50 , _baseDef = 70 , _baseSpd = 140 , _baseSpc = 80 , _killExp = 150 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (0, "Sonicboom") , (17, "Sonicboom") , (22, "Selfdestruct") , (29, "Light Screen") , (40, "Swift") , (50, "Explosion") ] } , Species { _name = "Exeggcute" , _expCurve = Slow , _type1 = Grass , _type2 = Just Psychic , _baseHP = 60 , _baseAtk = 40 , _baseDef = 80 , _baseSpd = 40 , _baseSpc = 60 , _killExp = 98 , _learnset = mkLearnset [ (0, "Barrage") , (0, "Hypnosis") , (25, "Reflect") , (28, "Leech Seed") , (32, "Stun Spore") , (37, "Poisonpowder") , (42, "Solarbeam") , (48, "Sleep Powder") ] } , Species { _name = "Exeggutor" , _expCurve = Slow , _type1 = Grass , _type2 = Just Psychic , _baseHP = 95 , _baseAtk = 95 , _baseDef = 85 , _baseSpd = 55 , _baseSpc = 125 , _killExp = 212 , _learnset = mkLearnset [ (0, "Barrage") , (0, "Hypnosis") , (28, "Stomp") ] } , Species { _name = "Cubone" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 50 , _baseAtk = 50 , _baseDef = 95 , _baseSpd = 35 , _baseSpc = 40 , _killExp = 87 , _learnset = mkLearnset [ (0, "Bone Club") , (0, "Growl") , (25, "Leer") , (31, "Focus Energy") , (38, "Thrash") , (43, "Bonemerang") , (46, "Rage") ] } , Species { _name = "Marowak" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 60 , _baseAtk = 80 , _baseDef = 110 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 124 , _learnset = mkLearnset [ (0, "Bone Club") , (0, "Growl") , (0, "Leer") , (0, "Focus Energy") , (25, "Leer") , (33, "Focus Energy") , (41, "Thrash") , (48, "Bonemerang") , (55, "Rage") ] } , Species { _name = "Hitmonlee" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 50 , _baseAtk = 120 , _baseDef = 53 , _baseSpd = 87 , _baseSpc = 35 , _killExp = 139 , _learnset = mkLearnset [ (0, "Double Kick") , (0, "Meditate") , (33, "Rolling Kick") , (38, "Jump Kick") , (43, "Focus Energy") , (48, "Hi Jump Kick") , (53, "Mega Kick") ] } , Species { _name = "Hitmonchan" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 50 , _baseAtk = 105 , _baseDef = 79 , _baseSpd = 76 , _baseSpc = 35 , _killExp = 140 , _learnset = mkLearnset [ (0, "Comet Punch") , (0, "Agility") , (33, "Fire Punch") , (38, "Ice Punch") , (43, "Thunderpunch") , (48, "Mega Punch") , (53, "Counter") ] } , Species { _name = "Lickitung" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 90 , _baseAtk = 55 , _baseDef = 75 , _baseSpd = 30 , _baseSpc = 60 , _killExp = 127 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Supersonic") , (7, "Stomp") , (15, "Disable") , (23, "Defense Curl") , (31, "Slam") , (39, "Screech") ] } , Species { _name = "Koffing" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 40 , _baseAtk = 65 , _baseDef = 95 , _baseSpd = 35 , _baseSpc = 60 , _killExp = 114 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Smog") , (32, "Sludge") , (37, "Smokescreen") , (40, "Selfdestruct") , (45, "Haze") , (48, "Explosion") ] } , Species { _name = "Weezing" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 65 , _baseAtk = 90 , _baseDef = 120 , _baseSpd = 60 , _baseSpc = 85 , _killExp = 173 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Smog") , (0, "Sludge") , (32, "Sludge") , (39, "Smokescreen") , (43, "Selfdestruct") , (49, "Haze") , (51, "Explosion") ] } , Species { _name = "Rhyhorn" , _expCurve = Slow , _type1 = Ground , _type2 = Just Rock , _baseHP = 80 , _baseAtk = 85 , _baseDef = 95 , _baseSpd = 25 , _baseSpc = 30 , _killExp = 135 , _learnset = mkLearnset [ (0, "Horn Attack") , (30, "Stomp") , (35, "Tail Whip") , (40, "Fury Attack") , (45, "Horn Drill") , (50, "Leer") , (55, "Take Down") ] } , Species { _name = "Rhydon" , _expCurve = Slow , _type1 = Ground , _type2 = Just Rock , _baseHP = 105 , _baseAtk = 130 , _baseDef = 120 , _baseSpd = 40 , _baseSpc = 45 , _killExp = 204 , _learnset = mkLearnset [ (0, "Horn Attack") , (0, "Stomp") , (0, "Tail Whip") , (0, "Fury Attack") , (30, "Stomp") , (35, "Tail Whip") , (40, "Fury Attack") , (48, "Horn Drill") , (55, "Leer") , (64, "Take Down") ] } , Species { _name = "Chansey" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 250 , _baseAtk = 5 , _baseDef = 5 , _baseSpd = 50 , _baseSpc = 105 , _killExp = 255 , _learnset = mkLearnset [ (0, "Pound") , (0, "Doubleslap") , (24, "Sing") , (30, "Growl") , (38, "Minimize") , (44, "Defense Curl") , (48, "Light Screen") , (54, "Double Edge") ] } , Species { _name = "Tangela" , _expCurve = Medium , _type1 = Grass , _type2 = Nothing , _baseHP = 65 , _baseAtk = 55 , _baseDef = 115 , _baseSpd = 60 , _baseSpc = 100 , _killExp = 166 , _learnset = mkLearnset [ (0, "Constrict") , (0, "Bind") , (29, "Absorb") , (32, "Poisonpowder") , (36, "Stun Spore") , (39, "Sleep Powder") , (45, "Slam") , (49, "Growth") ] } , Species { _name = "Kangaskhan" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 105 , _baseAtk = 95 , _baseDef = 80 , _baseSpd = 90 , _baseSpc = 40 , _killExp = 175 , _learnset = mkLearnset [ (0, "Comet Punch") , (0, "Rage") , (26, "Bite") , (31, "Tail Whip") , (36, "Mega Punch") , (41, "Leer") , (46, "Dizzy Punch") ] } , Species { _name = "Horsea" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 40 , _baseDef = 70 , _baseSpd = 60 , _baseSpc = 70 , _killExp = 83 , _learnset = mkLearnset [ (0, "Bubble") , (19, "Smokescreen") , (24, "Leer") , (30, "Water Gun") , (37, "Agility") , (45, "Hydro Pump") ] } , Species { _name = "Seadra" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 55 , _baseAtk = 65 , _baseDef = 95 , _baseSpd = 85 , _baseSpc = 95 , _killExp = 155 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Smokescreen") , (19, "Smokescreen") , (24, "Leer") , (30, "Water Gun") , (41, "Agility") , (52, "Hydro Pump") ] } , Species { _name = "Goldeen" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 45 , _baseAtk = 67 , _baseDef = 60 , _baseSpd = 63 , _baseSpc = 50 , _killExp = 111 , _learnset = mkLearnset [ (0, "Peck") , (0, "Tail Whip") , (19, "Supersonic") , (24, "Horn Attack") , (30, "Fury Attack") , (37, "Waterfall") , (45, "Horn Drill") , (54, "Agility") ] } , Species { _name = "Seaking" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 80 , _baseAtk = 92 , _baseDef = 65 , _baseSpd = 68 , _baseSpc = 80 , _killExp = 170 , _learnset = mkLearnset [ (0, "Peck") , (0, "Tail Whip") , (0, "Supersonic") , (19, "Supersonic") , (24, "Horn Attack") , (30, "Fury Attack") , (39, "Waterfall") , (48, "Horn Drill") , (54, "Agility") ] } , Species { _name = "Staryu" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 45 , _baseDef = 55 , _baseSpd = 85 , _baseSpc = 70 , _killExp = 106 , _learnset = mkLearnset [ (0, "Tackle") , (17, "Water Gun") , (22, "Harden") , (27, "Recover") , (32, "Swift") , (37, "Minimize") , (42, "Light Screen") , (47, "Hydro Pump") ] } , Species { _name = "Starmie" , _expCurve = Slow , _type1 = Water , _type2 = Just Psychic , _baseHP = 60 , _baseAtk = 75 , _baseDef = 85 , _baseSpd = 115 , _baseSpc = 100 , _killExp = 207 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Water Gun") , (0, "Harden") ] } , Species { _name = "MrMime" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 40 , _baseAtk = 45 , _baseDef = 65 , _baseSpd = 90 , _baseSpc = 100 , _killExp = 136 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Barrier") , (15, "Confusion") , (23, "Light Screen") , (31, "Doubleslap") , (39, "Meditate") , (47, "Substitute") ] } , Species { _name = "Scyther" , _expCurve = Medium , _type1 = Bug , _type2 = Just Flying , _baseHP = 70 , _baseAtk = 110 , _baseDef = 80 , _baseSpd = 105 , _baseSpc = 55 , _killExp = 187 , _learnset = mkLearnset [ (0, "Quick Attack") , (17, "Leer") , (20, "Focus Energy") , (24, "Double Team") , (29, "Slash") , (35, "Swords Dance") , (42, "Agility") ] } , Species { _name = "Jynx" , _expCurve = Medium , _type1 = Ice , _type2 = Just Psychic , _baseHP = 65 , _baseAtk = 50 , _baseDef = 35 , _baseSpd = 95 , _baseSpc = 95 , _killExp = 137 , _learnset = mkLearnset [ (0, "Pound") , (0, "Lovely Kiss") , (18, "Lick") , (23, "Doubleslap") , (31, "Ice Punch") , (39, "Body Slam") , (47, "Thrash") , (58, "Blizzard") ] } , Species { _name = "Electabuzz" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 65 , _baseAtk = 83 , _baseDef = 57 , _baseSpd = 105 , _baseSpc = 85 , _killExp = 156 , _learnset = mkLearnset [ (0, "Quick Attack") , (0, "Leer") , (34, "Thundershock") , (37, "Screech") , (42, "Thunderpunch") , (49, "Light Screen") , (54, "Thunder") ] } , Species { _name = "Magmar" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 95 , _baseDef = 57 , _baseSpd = 93 , _baseSpc = 85 , _killExp = 167 , _learnset = mkLearnset [ (0, "Ember") , (36, "Leer") , (39, "Confuse Ray") , (43, "Fire Punch") , (48, "Smokescreen") , (52, "Smog") , (55, "Flamethrower") ] } , Species { _name = "Pinsir" , _expCurve = Slow , _type1 = Bug , _type2 = Nothing , _baseHP = 65 , _baseAtk = 125 , _baseDef = 100 , _baseSpd = 85 , _baseSpc = 55 , _killExp = 200 , _learnset = mkLearnset [ (0, "Vicegrip") , (25, "Seismic Toss") , (30, "Guillotine") , (36, "Focus Energy") , (43, "Harden") , (49, "Slash") , (54, "Swords Dance") ] } , Species { _name = "Tauros" , _expCurve = Slow , _type1 = Normal , _type2 = Nothing , _baseHP = 75 , _baseAtk = 100 , _baseDef = 95 , _baseSpd = 110 , _baseSpc = 70 , _killExp = 211 , _learnset = mkLearnset [ (0, "Tackle") , (21, "Stomp") , (28, "Tail Whip") , (35, "Leer") , (44, "Rage") , (51, "Take Down") ] } , Species { _name = "Magikarp" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 20 , _baseAtk = 10 , _baseDef = 55 , _baseSpd = 80 , _baseSpc = 20 , _killExp = 20 , _learnset = mkLearnset [ (0, "Splash") , (15, "Tackle") ] } , Species { _name = "Gyarados" , _expCurve = Slow , _type1 = Water , _type2 = Just Flying , _baseHP = 95 , _baseAtk = 125 , _baseDef = 79 , _baseSpd = 81 , _baseSpc = 100 , _killExp = 214 , _learnset = mkLearnset [ (0, "Bite") , (0, "Dragon Rage") , (0, "Leer") , (0, "Hydro Pump") , (20, "Bite") , (25, "Dragon Rage") , (32, "Leer") , (41, "Hydro Pump") , (52, "Hyper Beam") ] } , Species { _name = "Lapras" , _expCurve = Slow , _type1 = Water , _type2 = Just Ice , _baseHP = 130 , _baseAtk = 85 , _baseDef = 80 , _baseSpd = 60 , _baseSpc = 95 , _killExp = 219 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Growl") , (16, "Sing") , (20, "Mist") , (25, "Body Slam") , (31, "Confuse Ray") , (38, "Ice Beam") , (46, "Hydro Pump") ] } , Species { _name = "Ditto" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 48 , _baseAtk = 48 , _baseDef = 48 , _baseSpd = 48 , _baseSpc = 48 , _killExp = 61 , _learnset = mkLearnset [ (0, "Transform") ] } , Species { _name = "Eevee" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 55 , _baseAtk = 55 , _baseDef = 50 , _baseSpd = 55 , _baseSpc = 65 , _killExp = 92 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (27, "Quick Attack") , (31, "Tail Whip") , (37, "Bite") , (45, "Take Down") ] } , Species { _name = "Vaporeon" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 130 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 65 , _baseSpc = 110 , _killExp = 196 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Water Gun") , (27, "Quick Attack") , (31, "Water Gun") , (37, "Tail Whip") , (40, "Bite") , (42, "Acid Armor") , (44, "Haze") , (48, "Mist") , (54, "Hydro Pump") ] } , Species { _name = "Jolteon" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 65 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 130 , _baseSpc = 110 , _killExp = 197 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Thundershock") , (27, "Quick Attack") , (31, "Thundershock") , (37, "Tail Whip") , (40, "Thunder Wave") , (42, "Double Kick") , (44, "Agility") , (48, "Pin Missile") , (54, "Thunder") ] } , Species { _name = "Flareon" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 130 , _baseDef = 60 , _baseSpd = 65 , _baseSpc = 110 , _killExp = 198 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Ember") , (27, "Quick Attack") , (31, "Ember") , (37, "Tail Whip") , (40, "Bite") , (42, "Leer") , (44, "Fire Spin") , (48, "Rage") , (54, "Flamethrower") ] } , Species { _name = "Porygon" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 65 , _baseAtk = 60 , _baseDef = 70 , _baseSpd = 40 , _baseSpc = 75 , _killExp = 130 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sharpen") , (0, "Conversion") , (23, "Psybeam") , (28, "Recover") , (35, "Agility") , (42, "Tri Attack") ] } , Species { _name = "Omanyte" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 35 , _baseAtk = 40 , _baseDef = 100 , _baseSpd = 35 , _baseSpc = 90 , _killExp = 120 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Withdraw") , (34, "Horn Attack") , (39, "Leer") , (46, "Spike Cannon") , (53, "Hydro Pump") ] } , Species { _name = "Omastar" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 70 , _baseAtk = 60 , _baseDef = 125 , _baseSpd = 55 , _baseSpc = 115 , _killExp = 199 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Withdraw") , (0, "Horn Attack") , (34, "Horn Attack") , (39, "Leer") , (44, "Spike Cannon") , (49, "Hydro Pump") ] } , Species { _name = "Kabuto" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 30 , _baseAtk = 80 , _baseDef = 90 , _baseSpd = 55 , _baseSpc = 45 , _killExp = 119 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Harden") , (34, "Absorb") , (39, "Slash") , (44, "Leer") , (49, "Hydro Pump") ] } , Species { _name = "Kabutops" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 60 , _baseAtk = 115 , _baseDef = 105 , _baseSpd = 80 , _baseSpc = 70 , _killExp = 201 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Harden") , (0, "Absorb") , (34, "Absorb") , (39, "Slash") , (46, "Leer") , (53, "Hydro Pump") ] } , Species { _name = "Aerodactyl" , _expCurve = Slow , _type1 = Rock , _type2 = Just Flying , _baseHP = 80 , _baseAtk = 105 , _baseDef = 65 , _baseSpd = 130 , _baseSpc = 60 , _killExp = 202 , _learnset = mkLearnset [ (0, "Wing Attack") , (0, "Agility") , (33, "Supersonic") , (38, "Bite") , (45, "Take Down") , (54, "Hyper Beam") ] } , Species { _name = "Snorlax" , _expCurve = Slow , _type1 = Normal , _type2 = Nothing , _baseHP = 160 , _baseAtk = 110 , _baseDef = 65 , _baseSpd = 30 , _baseSpc = 65 , _killExp = 154 , _learnset = mkLearnset [ (0, "Headbutt") , (0, "Amnesia") , (0, "Rest") , (35, "Body Slam") , (41, "Harden") , (48, "Double Edge") , (56, "Hyper Beam") ] } , Species { _name = "Articuno" , _expCurve = Slow , _type1 = Ice , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 85 , _baseDef = 100 , _baseSpd = 85 , _baseSpc = 125 , _killExp = 215 , _learnset = mkLearnset [ (0, "Peck") , (0, "Ice Beam") , (51, "Blizzard") , (55, "Agility") , (60, "Mist") ] } , Species { _name = "Zapdos" , _expCurve = Slow , _type1 = Electric , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 90 , _baseDef = 85 , _baseSpd = 100 , _baseSpc = 125 , _killExp = 216 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Drill Peck") , (51, "Thunder") , (55, "Agility") , (60, "Light Screen") ] } , Species { _name = "Moltres" , _expCurve = Slow , _type1 = Fire , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 100 , _baseDef = 90 , _baseSpd = 90 , _baseSpc = 125 , _killExp = 217 , _learnset = mkLearnset [ (0, "Peck") , (0, "Fire Spin") , (51, "Leer") , (55, "Agility") , (60, "Sky Attack") ] } , Species { _name = "Dratini" , _expCurve = Slow , _type1 = Dragon , _type2 = Nothing , _baseHP = 41 , _baseAtk = 64 , _baseDef = 45 , _baseSpd = 50 , _baseSpc = 50 , _killExp = 67 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (10, "Thunder Wave") , (20, "Agility") , (30, "Slam") , (40, "Dragon Rage") , (50, "Hyper Beam") ] } , Species { _name = "Dragonair" , _expCurve = Slow , _type1 = Dragon , _type2 = Nothing , _baseHP = 61 , _baseAtk = 84 , _baseDef = 65 , _baseSpd = 70 , _baseSpc = 70 , _killExp = 144 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Thunder Wave") , (10, "Thunder Wave") , (20, "Agility") , (35, "Slam") , (45, "Dragon Rage") , (55, "Hyper Beam") ] } , Species { _name = "Dragonite" , _expCurve = Slow , _type1 = Dragon , _type2 = Just Flying , _baseHP = 91 , _baseAtk = 134 , _baseDef = 95 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 218 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Thunder Wave") , (0, "Agility") , (10, "Thunder Wave") , (20, "Agility") , (35, "Slam") , (45, "Dragon Rage") , (60, "Hyper Beam") ] } , Species { _name = "Mewtwo" , _expCurve = Slow , _type1 = Psychic , _type2 = Nothing , _baseHP = 106 , _baseAtk = 110 , _baseDef = 90 , _baseSpd = 130 , _baseSpc = 154 , _killExp = 220 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Disable") , (0, "Swift") , (0, "Psychic") , (63, "Barrier") , (66, "Psychic") , (70, "Recover") , (75, "Mist") , (81, "Amnesia") ] } , Species { _name = "Mew" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 100 , _baseAtk = 100 , _baseDef = 100 , _baseSpd = 100 , _baseSpc = 100 , _killExp = 64 , _learnset = mkLearnset [ (0, "Pound") , (10, "Transform") , (20, "Mega Punch") , (30, "Metronome") , (40, "Psychic") ] } ]
85,563
allSpecies :: [Species] allSpecies = [ Species { _name = "Bulbasaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 49 , _baseDef = 49 , _baseSpd = 45 , _baseSpc = 65 , _killExp = 64 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (7, "Leech Seed") , (13, "Vine Whip") , (20, "Poisonpowder") , (27, "Razor Leaf") , (34, "Growth") , (41, "Sleep Powder") , (48, "Solarbeam") ] } , Species { _name = "Ivysaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 62 , _baseDef = 63 , _baseSpd = 60 , _baseSpc = 80 , _killExp = 141 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (0, "Leech Seed") , (7, "Leech Seed") , (13, "Vine Whip") , (22, "Poisonpowder") , (30, "Razor Leaf") , (38, "Growth") , (46, "Sleep Powder") , (54, "Solarbeam") ] } , Species { _name = "Venusaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 82 , _baseDef = 83 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 208 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (0, "Leech Seed") , (0, "Vine Whip") , (7, "Leech Seed") , (13, "Vine Whip") , (22, "Poisonpowder") , (30, "Razor Leaf") , (43, "Growth") , (55, "Sleep Powder") , (65, "Solarbeam") ] } , Species { _name = "Charmander" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Nothing , _baseHP = 39 , _baseAtk = 52 , _baseDef = 43 , _baseSpd = 65 , _baseSpc = 50 , _killExp = 65 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (9, "Ember") , (15, "Leer") , (22, "Rage") , (30, "Slash") , (38, "Flamethrower") , (46, "Fire Spin") ] } , Species { _name = "Charmeleon" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Nothing , _baseHP = 58 , _baseAtk = 64 , _baseDef = 58 , _baseSpd = 80 , _baseSpc = 65 , _killExp = 142 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Ember") , (9, "Ember") , (15, "Leer") , (24, "Rage") , (33, "Slash") , (42, "Flamethrower") , (56, "Fire Spin") ] } , Species { _name = "Charizard" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Just Flying , _baseHP = 78 , _baseAtk = 84 , _baseDef = 78 , _baseSpd = 100 , _baseSpc = 85 , _killExp = 209 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Ember") , (0, "Leer") , (9, "Ember") , (15, "Leer") , (24, "Rage") , (36, "Slash") , (46, "Flamethrower") , (55, "Fire Spin") ] } , Species { _name = "Squirtle" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 44 , _baseAtk = 48 , _baseDef = 65 , _baseSpd = 43 , _baseSpc = 50 , _killExp = 66 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (8, "Bubble") , (15, "Water Gun") , (22, "Bite") , (28, "Withdraw") , (35, "Skull Bash") , (42, "Hydro Pump") ] } , Species { _name = "Wartortle" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 59 , _baseAtk = 63 , _baseDef = 80 , _baseSpd = 58 , _baseSpc = 65 , _killExp = 143 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Bubble") , (8, "Bubble") , (15, "Water Gun") , (24, "Bite") , (31, "Withdraw") , (39, "Skull Bash") , (47, "Hydro Pump") ] } , Species { _name = "Blastoise" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 79 , _baseAtk = 83 , _baseDef = 100 , _baseSpd = 78 , _baseSpc = 85 , _killExp = 210 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Bubble") , (0, "Water Gun") , (8, "Bubble") , (15, "Water Gun") , (24, "Bite") , (31, "Withdraw") , (42, "Skull Bash") , (52, "Hydro Pump") ] } , Species { _name = "Caterpie" , _expCurve = Medium , _type1 = Bug , _type2 = Nothing , _baseHP = 45 , _baseAtk = 30 , _baseDef = 35 , _baseSpd = 45 , _baseSpc = 20 , _killExp = 53 , _learnset = mkLearnset [ (0, "Tackle") , (0, "String Shot") ] } , Species { _name = "Metapod" , _expCurve = Medium , _type1 = Bug , _type2 = Nothing , _baseHP = 50 , _baseAtk = 20 , _baseDef = 55 , _baseSpd = 30 , _baseSpc = 25 , _killExp = 72 , _learnset = mkLearnset [ (0, "Harden") ] } , Species { _name = "Butterfree" , _expCurve = Medium , _type1 = Bug , _type2 = Just Flying , _baseHP = 60 , _baseAtk = 45 , _baseDef = 50 , _baseSpd = 70 , _baseSpc = 80 , _killExp = 160 , _learnset = mkLearnset [ (0, "Confusion") , (12, "Confusion") , (15, "Poisonpowder") , (16, "Stun Spore") , (17, "Sleep Powder") , (21, "Supersonic") , (26, "Whirlwind") , (32, "Psybeam") ] } , Species { _name = "Weedle" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 40 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 50 , _baseSpc = 20 , _killExp = 52 , _learnset = mkLearnset [ (0, "Poison Sting") , (0, "String Shot") ] } , Species { _name = "Kakuna" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 25 , _baseDef = 50 , _baseSpd = 35 , _baseSpc = 25 , _killExp = 71 , _learnset = mkLearnset [ (0, "Harden") ] } , Species { _name = "Beedrill" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 65 , _baseAtk = 80 , _baseDef = 40 , _baseSpd = 75 , _baseSpc = 45 , _killExp = 159 , _learnset = mkLearnset [ (0, "Fury Attack") , (12, "Fury Attack") , (16, "Focus Energy") , (20, "Twineedle") , (25, "Rage") , (30, "Pin Missile") , (35, "Agility") ] } , Species { _name = "Pidgey" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 45 , _baseDef = 40 , _baseSpd = 56 , _baseSpc = 35 , _killExp = 55 , _learnset = mkLearnset [ (0, "Gust") , (5, "Sand Attack") , (12, "Quick Attack") , (19, "Whirlwind") , (28, "Wing Attack") , (36, "Agility") , (44, "Mirror Move") ] } , Species { _name = "Pidgeotto" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 63 , _baseAtk = 60 , _baseDef = 55 , _baseSpd = 71 , _baseSpc = 50 , _killExp = 113 , _learnset = mkLearnset [ (0, "Gust") , (0, "Sand Attack") , (5, "Sand Attack") , (12, "Quick Attack") , (21, "Whirlwind") , (31, "Wing Attack") , (40, "Agility") , (49, "Mirror Move") ] } , Species { _name = "Pidgeot" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 83 , _baseAtk = 80 , _baseDef = 75 , _baseSpd = 91 , _baseSpc = 70 , _killExp = 172 , _learnset = mkLearnset [ (0, "Gust") , (0, "Sand Attack") , (0, "Quick Attack") , (5, "Sand Attack") , (12, "Quick Attack") , (21, "Whirlwind") , (31, "Wing Attack") , (44, "Agility") , (54, "Mirror Move") ] } , Species { _name = "Rattata" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 30 , _baseAtk = 56 , _baseDef = 35 , _baseSpd = 72 , _baseSpc = 25 , _killExp = 57 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (7, "Quick Attack") , (14, "Hyper Fang") , (23, "Focus Energy") , (34, "Super Fang") ] } , Species { _name = "Raticate" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 55 , _baseAtk = 81 , _baseDef = 60 , _baseSpd = 97 , _baseSpc = 50 , _killExp = 116 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Quick Attack") , (7, "Quick Attack") , (14, "Hyper Fang") , (27, "Focus Energy") , (41, "Super Fang")] } , Species { _name = "Spearow" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 60 , _baseDef = 30 , _baseSpd = 70 , _baseSpc = 31 , _killExp = 58 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (9, "Leer") , (15, "Fury Attack") , (22, "Mirror Move") , (29, "Drill Peck") , (36, "Agility") ] } , Species { _name = "Fearow" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 65 , _baseAtk = 90 , _baseDef = 65 , _baseSpd = 100 , _baseSpc = 61 , _killExp = 162 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (0, "Leer") , (9, "Leer") , (15, "Fury Attack") , (25, "Mirror Move") , (34, "Drill Peck") , (43, "Agility") ] } , Species { _name = "Ekans" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 35 , _baseAtk = 60 , _baseDef = 44 , _baseSpd = 55 , _baseSpc = 40 , _killExp = 62 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (10, "Poison Sting") , (17, "Bite") , (24, "Glare") , (31, "Screech") , (38, "Acid") ] } , Species { _name = "Arbok" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 60 , _baseAtk = 85 , _baseDef = 69 , _baseSpd = 80 , _baseSpc = 65 , _killExp = 147 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Poison Sting") , (10, "Poison Sting") , (17, "Bite") , (27, "Glare") , (36, "Screech") , (47, "Acid") ] } , Species { _name = "Pikachu" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 35 , _baseAtk = 55 , _baseDef = 30 , _baseSpd = 90 , _baseSpc = 50 , _killExp = 82 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Growl") , (9, "Thunder Wave") , (16, "Quick Attack") , (26, "Swift") , (33, "Agility") , (43, "Thunder") ] } , Species { _name = "Raichu" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 60 , _baseAtk = 90 , _baseDef = 55 , _baseSpd = 100 , _baseSpc = 90 , _killExp = 122 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Growl") , (0, "Thunder Wave") ] } , Species { _name = "Sandshrew" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 50 , _baseAtk = 75 , _baseDef = 85 , _baseSpd = 40 , _baseSpc = 30 , _killExp = 93 , _learnset = mkLearnset [ (0, "Scratch") , (10, "Sand Attack") , (17, "Slash") , (24, "Poison Sting") , (31, "Swift") , (38, "Fury Swipes") ] } , Species { _name = "Sandslash" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 75 , _baseAtk = 100 , _baseDef = 110 , _baseSpd = 65 , _baseSpc = 55 , _killExp = 163 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Sand Attack") , (10, "Sand Attack") , (17, "Slash") , (27, "Poison Sting") , (36, "Swift") , (47, "Fury Swipes") ] } , Species { _name = "NidoranF" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 55 , _baseAtk = 47 , _baseDef = 52 , _baseSpd = 41 , _baseSpc = 40 , _killExp = 59 , _learnset = mkLearnset [ (0, "Growl") , (0, "Tackle") , (8, "Scratch") , (14, "Poison Sting") , (21, "Tail Whip") , (29, "Bite") , (36, "Fury Swipes") , (43, "Double Kick") ] } , Species { _name = "Nidorina" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 70 , _baseAtk = 62 , _baseDef = 67 , _baseSpd = 56 , _baseSpc = 55 , _killExp = 117 , _learnset = mkLearnset [ (0, "Growl") , (0, "Tackle") , (0, "Scratch") , (8, "Scratch") , (14, "Poison Sting") , (23, "Tail Whip") , (32, "Bite") , (41, "Fury Swipes") , (50, "Double Kick") ] } , Species { _name = "Nidoqueen" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Just Ground , _baseHP = 90 , _baseAtk = 82 , _baseDef = 87 , _baseSpd = 76 , _baseSpc = 75 , _killExp = 194 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Scratch") , (0, "Tail Whip") , (0, "Body Slam") , (8, "Scratch") , (14, "Poison Sting") , (23, "Body Slam") ] } , Species { _name = "NidoranM" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 46 , _baseAtk = 57 , _baseDef = 40 , _baseSpd = 50 , _baseSpc = 40 , _killExp = 60 , _learnset = mkLearnset [ (0, "Leer") , (0, "Tackle") , (8, "Horn Attack") , (14, "Poison Sting") , (21, "Focus Energy") , (29, "Fury Attack") , (36, "Horn Drill") , (43, "Double Kick") ] } , Species { _name = "Nidorino" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 61 , _baseAtk = 72 , _baseDef = 57 , _baseSpd = 65 , _baseSpc = 55 , _killExp = 118 , _learnset = mkLearnset [ (0, "Leer") , (0, "Tackle") , (0, "Horn Attack") , (8, "Horn Attack") , (14, "Poison Sting") , (23, "Focus Energy") , (32, "Fury Attack") , (41, "Horn Drill") , (50, "Double Kick") ] } , Species { _name = "Nidoking" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Just Ground , _baseHP = 81 , _baseAtk = 92 , _baseDef = 77 , _baseSpd = 85 , _baseSpc = 75 , _killExp = 195 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Horn Attack") , (0, "Poison Sting") , (0, "Thrash") , (8, "Horn Attack") , (14, "Poison Sting") , (23, "Thrash") ] } , Species { _name = "Clefairy" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 70 , _baseAtk = 45 , _baseDef = 48 , _baseSpd = 35 , _baseSpc = 60 , _killExp = 68 , _learnset = mkLearnset [ (0, "Pound") , (0, "Growl") , (13, "Sing") , (18, "Doubleslap") , (24, "Minimize") , (31, "Metronome") , (39, "Defense Curl") , (48, "Light Screen") ] } , Species { _name = "Clefable" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 95 , _baseAtk = 70 , _baseDef = 73 , _baseSpd = 60 , _baseSpc = 85 , _killExp = 129 , _learnset = mkLearnset [ (0, "Sing") , (0, "Doubleslap") , (0, "Minimize") , (0, "Metronome") ] } , Species { _name = "Vulpix" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 38 , _baseAtk = 41 , _baseDef = 40 , _baseSpd = 65 , _baseSpc = 65 , _killExp = 63 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (16, "Quick Attack") , (21, "Roar") , (28, "Confuse Ray") , (35, "Flamethrower") , (42, "Fire Spin") ] } , Species { _name = "Ninetales" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 73 , _baseAtk = 76 , _baseDef = 75 , _baseSpd = 100 , _baseSpc = 100 , _killExp = 178 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (0, "Quick Attack") , (0, "Roar") ] } , Species { _name = "Jigglypuff" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 115 , _baseAtk = 45 , _baseDef = 20 , _baseSpd = 20 , _baseSpc = 25 , _killExp = 76 , _learnset = mkLearnset [ (0, "Sing") , (9, "Pound") , (14, "Disable") , (19, "Defense Curl") , (24, "Doubleslap") , (29, "Rest") , (34, "Body Slam") , (39, "Double Edge") ] } , Species { _name = "Wigglytuff" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 140 , _baseAtk = 70 , _baseDef = 45 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 109 , _learnset = mkLearnset [ (0, "Sing") , (0, "Disable") , (0, "Defense Curl") , (0, "Doubleslap") ] } , Species { _name = "Zubat" , _expCurve = Medium , _type1 = Poison , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 45 , _baseDef = 35 , _baseSpd = 55 , _baseSpc = 40 , _killExp = 54 , _learnset = mkLearnset [ (0, "Leech Life") , (10, "Supersonic") , (15, "Bite") , (21, "Confuse Ray") , (28, "Wing Attack") , (36, "Haze") ] } , Species { _name = "Golbat" , _expCurve = Medium , _type1 = Poison , _type2 = Just Flying , _baseHP = 75 , _baseAtk = 80 , _baseDef = 70 , _baseSpd = 90 , _baseSpc = 75 , _killExp = 171 , _learnset = mkLearnset [ (0, "Leech Life") , (0, "Screech") , (0, "Bite") , (10, "Supersonic") , (15, "Bite") , (21, "Confuse Ray") , (32, "Wing Attack") , (43, "Haze") ] } , Species { _name = "Oddish" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 50 , _baseDef = 55 , _baseSpd = 30 , _baseSpc = 75 , _killExp = 78 , _learnset = mkLearnset [ (0, "Absorb") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") , (24, "Acid") , (33, "Petal Dance") , (46, "Solarbeam") ] } , Species { _name = "Gloom" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 65 , _baseDef = 70 , _baseSpd = 40 , _baseSpc = 85 , _killExp = 132 , _learnset = mkLearnset [ (0, "Absorb") , (0, "Poisonpowder") , (0, "Stun Spore") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") , (28, "Acid") , (38, "Petal Dance") , (52, "Solarbeam") ] } , Species { _name = "Vileplume" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 75 , _baseAtk = 80 , _baseDef = 85 , _baseSpd = 50 , _baseSpc = 100 , _killExp = 184 , _learnset = mkLearnset [ (0, "Stun Spore") , (0, "Sleep Powder") , (0, "Acid") , (0, "Petal Dance") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") ] } , Species { _name = "Paras" , _expCurve = Medium , _type1 = Bug , _type2 = Just Grass , _baseHP = 35 , _baseAtk = 70 , _baseDef = 55 , _baseSpd = 25 , _baseSpc = 55 , _killExp = 70 , _learnset = mkLearnset [ (0, "Scratch") , (13, "Stun Spore") , (20, "Leech Life") , (27, "Spore") , (34, "Slash") , (41, "Growth") ] } , Species { _name = "Parasect" , _expCurve = Medium , _type1 = Bug , _type2 = Just Grass , _baseHP = 60 , _baseAtk = 95 , _baseDef = 80 , _baseSpd = 30 , _baseSpc = 80 , _killExp = 128 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Stun Spore") , (0, "Leech Life") , (13, "Stun Spore") , (20, "Leech Life") , (30, "Spore") , (39, "Slash") , (48, "Growth") ] } , Species { _name = "Venonat" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 55 , _baseDef = 50 , _baseSpd = 45 , _baseSpc = 40 , _killExp = 75 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Disable") , (24, "Poisonpowder") , (27, "Leech Life") , (30, "Stun Spore") , (35, "Psybeam") , (38, "Sleep Powder") , (43, "Psychic") ] } , Species { _name = "Venomoth" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 70 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 90 , _baseSpc = 90 , _killExp = 138 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Disable") , (0, "Poisonpowder") , (0, "Leech Life") , (24, "Poisonpowder") , (27, "Leech Life") , (30, "Stun Spore") , (38, "Psybeam") , (43, "Sleep Powder") , (50, "Psychic") ] } , Species { _name = "Diglett" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 10 , _baseAtk = 55 , _baseDef = 25 , _baseSpd = 95 , _baseSpc = 45 , _killExp = 81 , _learnset = mkLearnset [ (0, "Scratch") , (15, "Growl") , (19, "Dig") , (24, "Sand Attack") , (31, "Slash") , (40, "Earthquake") ] } , Species { _name = "Dugtrio" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 35 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 120 , _baseSpc = 70 , _killExp = 153 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Dig") , (15, "Growl") , (19, "Dig") , (24, "Sand Attack") , (35, "Slash") , (47, "Earthquake") ] } , Species { _name = "Meowth" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 40 , _baseAtk = 45 , _baseDef = 35 , _baseSpd = 90 , _baseSpc = 45 , _killExp = 69 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (12, "Bite") , (17, "Pay Day") , (24, "Screech") , (33, "Fury Swipes") , (44, "Slash") ] } , Species { _name = "Persian" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 65 , _baseAtk = 70 , _baseDef = 60 , _baseSpd = 115 , _baseSpc = 65 , _killExp = 148 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Bite") , (0, "Screech") , (12, "Bite") , (17, "Pay Day") , (24, "Screech") , (37, "Fury Swipes") , (51, "Slash") ] } , Species { _name = "Psyduck" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 50 , _baseAtk = 52 , _baseDef = 48 , _baseSpd = 55 , _baseSpc = 50 , _killExp = 80 , _learnset = mkLearnset [ (0, "Scratch") , (28, "Tail Whip") , (31, "Disable") , (36, "Confusion") , (43, "Fury Swipes") , (52, "Hydro Pump") ] } , Species { _name = "Golduck" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 80 , _baseAtk = 82 , _baseDef = 78 , _baseSpd = 85 , _baseSpc = 80 , _killExp = 174 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Tail Whip") , (0, "Disable") , (28, "Tail Whip") , (31, "Disable") , (39, "Confusion") , (48, "Fury Swipes") , (59, "Hydro Pump") ] } , Species { _name = "Mankey" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 40 , _baseAtk = 80 , _baseDef = 35 , _baseSpd = 70 , _baseSpc = 35 , _killExp = 74 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Leer") , (15, "Karate Chop") , (21, "Fury Swipes") , (27, "Focus Energy") , (33, "Seismic Toss") , (39, "Thrash") ] } , Species { _name = "Primeape" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 65 , _baseAtk = 105 , _baseDef = 60 , _baseSpd = 95 , _baseSpc = 60 , _killExp = 149 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Leer") , (0, "Karate Chop") , (0, "Fury Swipes") , (15, "Karate Chop") , (21, "Fury Swipes") , (27, "Focus Energy") , (37, "Seismic Toss") , (46, "Thrash") ] } , Species { _name = "Growlithe" , _expCurve = Slow , _type1 = Fire , _type2 = Nothing , _baseHP = 55 , _baseAtk = 70 , _baseDef = 45 , _baseSpd = 60 , _baseSpc = 50 , _killExp = 91 , _learnset = mkLearnset [ (0, "Bite") , (0, "Roar") , (18, "Ember") , (23, "Leer") , (30, "Take Down") , (39, "Agility") , (50, "Flamethrower") ] } , Species { _name = "Arcanine" , _expCurve = Slow , _type1 = Fire , _type2 = Nothing , _baseHP = 90 , _baseAtk = 110 , _baseDef = 80 , _baseSpd = 95 , _baseSpc = 80 , _killExp = 213 , _learnset = mkLearnset [ (0, "Roar") , (0, "Ember") , (0, "Leer") , (0, "Take Down") ] } , Species { _name = "Poliwag" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 40 , _baseAtk = 50 , _baseDef = 40 , _baseSpd = 90 , _baseSpc = 40 , _killExp = 77 , _learnset = mkLearnset [ (0, "Bubble") , (16, "Hypnosis") , (19, "Water Gun") , (25, "Doubleslap") , (31, "Body Slam") , (38, "Amnesia") , (45, "Hydro Pump") ] } , Species { _name = "Poliwhirl" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 65 , _baseAtk = 65 , _baseDef = 65 , _baseSpd = 90 , _baseSpc = 50 , _killExp = 131 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Hypnosis") , (0, "Water Gun") , (16, "Hypnosis") , (19, "Water Gun") , (26, "Doubleslap") , (33, "Body Slam") , (41, "Amnesia") , (49, "Hydro Pump") ] } , Species { _name = "Poliwrath" , _expCurve = MediumSlow , _type1 = Water , _type2 = Just Fighting , _baseHP = 90 , _baseAtk = 85 , _baseDef = 95 , _baseSpd = 70 , _baseSpc = 70 , _killExp = 185 , _learnset = mkLearnset [ (0, "Hypnosis") , (0, "Water Gun") , (0, "Doubleslap") , (0, "Body Slam") , (16, "Hypnosis") , (19, "Water Gun") ] } , Species { _name = "Abra" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 25 , _baseAtk = 20 , _baseDef = 15 , _baseSpd = 90 , _baseSpc = 105 , _killExp = 73 , _learnset = mkLearnset [ (0, "Teleport") ] } , Species { _name = "Kadabra" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 40 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 105 , _baseSpc = 120 , _killExp = 145 , _learnset = mkLearnset [ (0, "Teleport") , (0, "Confusion") , (0, "Disable") , (16, "Confusion") , (20, "Disable") , (27, "Psybeam") , (31, "Recover") , (38, "Psychic") , (42, "Reflect") ] } , Species { _name = "Alakazam" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 55 , _baseAtk = 50 , _baseDef = 45 , _baseSpd = 120 , _baseSpc = 135 , _killExp = 186 , _learnset = mkLearnset [ (0, "Teleport") , (0, "Confusion") , (0, "Disable") , (16, "Confusion") , (20, "Disable") , (27, "Psybeam") , (31, "Recover") , (38, "Psychic") , (42, "Reflect") ] } , Species { _name = "Machop" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 70 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 35 , _baseSpc = 35 , _killExp = 88 , _learnset = mkLearnset [ (0, "Karate Chop") , (20, "Low Kick") , (25, "Leer") , (32, "Focus Energy") , (39, "Seismic Toss") , (46, "Submission") ] } , Species { _name = "Machoke" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 80 , _baseAtk = 100 , _baseDef = 70 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 146 , _learnset = mkLearnset [ (0, "Karate Chop") , (0, "Low Kick") , (0, "Leer") , (20, "Low Kick") , (25, "Leer") , (36, "Focus Energy") , (44, "Seismic Toss") , (52, "Submission") ] } , Species { _name = "Machamp" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 90 , _baseAtk = 130 , _baseDef = 80 , _baseSpd = 55 , _baseSpc = 65 , _killExp = 193 , _learnset = mkLearnset [ (0, "Karate Chop") , (0, "Low Kick") , (0, "Leer") , (20, "Low Kick") , (25, "Leer") , (36, "Focus Energy") , (44, "Seismic Toss") , (52, "Submission") ] } , Species { _name = "Bellsprout" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 50 , _baseAtk = 75 , _baseDef = 35 , _baseSpd = 40 , _baseSpc = 70 , _killExp = 84 , _learnset = mkLearnset [ (0, "Vine Whip") , (0, "Growth") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") , (21, "Stun Spore") , (26, "Acid") , (33, "Razor Leaf") , (42, "Slam") ] } , Species { _name = "Weepinbell" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 65 , _baseAtk = 90 , _baseDef = 50 , _baseSpd = 55 , _baseSpc = 85 , _killExp = 151 , _learnset = mkLearnset [ (0, "Vine Whip") , (0, "Growth") , (0, "Wrap") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") , (23, "Stun Spore") , (29, "Acid") , (38, "Razor Leaf") , (49, "Slam") ] } , Species { _name = "Victreebel" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 105 , _baseDef = 65 , _baseSpd = 70 , _baseSpc = 100 , _killExp = 191 , _learnset = mkLearnset [ (0, "Sleep Powder") , (0, "Stun Spore") , (0, "Acid") , (0, "Razor Leaf") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") ] } , Species { _name = "Tentacool" , _expCurve = Slow , _type1 = Water , _type2 = Just Poison , _baseHP = 40 , _baseAtk = 80 , _baseDef = 100 , _baseSpd = 20 , _baseSpc = 30 , _killExp = 105 , _learnset = mkLearnset [ (0, "Acid") , (7, "Supersonic") , (13, "Wrap") , (18, "Poison Sting") , (22, "Water Gun") , (27, "Constrict") , (33, "Barrier") , (40, "Screech") , (48, "Hydro Pump") ] } , Species { _name = "Tentacruel" , _expCurve = Slow , _type1 = Water , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 70 , _baseDef = 65 , _baseSpd = 100 , _baseSpc = 120 , _killExp = 205 , _learnset = mkLearnset [ (0, "Acid") , (0, "Supersonic") , (0, "Wrap") , (7, "Supersonic") , (13, "Wrap") , (18, "Poison Sting") , (22, "Water Gun") , (27, "Constrict") , (35, "Barrier") , (43, "Screech") , (50, "Hydro Pump") ] } , Species { _name = "Geodude" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 40 , _baseAtk = 80 , _baseDef = 100 , _baseSpd = 20 , _baseSpc = 30 , _killExp = 86 , _learnset = mkLearnset [ (0, "Tackle") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (26, "Harden") , (31, "Earthquake") , (36, "Explosion") ] } , Species { _name = "Graveler" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 55 , _baseAtk = 95 , _baseDef = 115 , _baseSpd = 35 , _baseSpc = 45 , _killExp = 134 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Defense Curl") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (29, "Harden") , (36, "Earthquake") , (43, "Explosion") ] } , Species { _name = "Golem" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 80 , _baseAtk = 110 , _baseDef = 130 , _baseSpd = 45 , _baseSpc = 55 , _killExp = 177 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Defense Curl") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (29, "Harden") , (36, "Earthquake") , (43, "Explosion") ] } , Species { _name = "Ponyta" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 50 , _baseAtk = 85 , _baseDef = 55 , _baseSpd = 90 , _baseSpc = 65 , _killExp = 152 , _learnset = mkLearnset [ (0, "Ember") , (30, "Tail Whip") , (32, "Stomp") , (35, "Growl") , (39, "Fire Spin") , (43, "Take Down") , (48, "Agility") ] } , Species { _name = "Rapidash" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 100 , _baseDef = 70 , _baseSpd = 105 , _baseSpc = 80 , _killExp = 192 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (0, "Stomp") , (0, "Growl") , (30, "Tail Whip") , (32, "Stomp") , (35, "Growl") , (39, "Fire Spin") , (47, "Take Down") , (55, "Agility") ] } , Species { _name = "Slowpoke" , _expCurve = Medium , _type1 = Water , _type2 = Just Psychic , _baseHP = 90 , _baseAtk = 65 , _baseDef = 65 , _baseSpd = 15 , _baseSpc = 40 , _killExp = 99 , _learnset = mkLearnset [ (0, "Confusion") , (18, "Disable") , (22, "Headbutt") , (27, "Growl") , (33, "Water Gun") , (40, "Amnesia") , (48, "Psychic") ] } , Species { _name = "Slowbro" , _expCurve = Medium , _type1 = Water , _type2 = Just Psychic , _baseHP = 95 , _baseAtk = 75 , _baseDef = 110 , _baseSpd = 30 , _baseSpc = 80 , _killExp = 164 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Disable") , (0, "Headbutt") , (18, "Disable") , (22, "Headbutt") , (27, "Growl") , (33, "Water Gun") , (37, "Withdraw") , (44, "Amnesia") , (55, "Psychic") ] } , Species { _name = "Magnemite" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 25 , _baseAtk = 35 , _baseDef = 70 , _baseSpd = 45 , _baseSpc = 95 , _killExp = 89 , _learnset = mkLearnset [ (0, "Tackle") , (21, "Sonicboom") , (25, "Thundershock") , (29, "Supersonic") , (35, "Thunder Wave") , (41, "Swift") , (47, "Screech") ] } , Species { _name = "Magneton" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 50 , _baseAtk = 60 , _baseDef = 95 , _baseSpd = 70 , _baseSpc = 120 , _killExp = 169 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sonicboom") , (0, "Thundershock") , (21, "Sonicboom") , (25, "Thundershock") , (29, "Supersonic") , (38, "Thunder Wave") , (46, "Swift") , (54, "Screech") ] } , Species { _name = "Farfetchd" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 52 , _baseAtk = 65 , _baseDef = 55 , _baseSpd = 60 , _baseSpc = 58 , _killExp = 94 , _learnset = mkLearnset [ (0, "Peck") , (0, "Sand Attack") , (7, "Leer") , (15, "Fury Attack") , (23, "Swords Dance") , (31, "Agility") , (39, "Slash") ] } , Species { _name = "Doduo" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 35 , _baseAtk = 85 , _baseDef = 45 , _baseSpd = 75 , _baseSpc = 35 , _killExp = 96 , _learnset = mkLearnset [ (0, "Peck") , (20, "Growl") , (24, "Fury Attack") , (30, "Drill Peck") , (36, "Rage") , (40, "Tri Attack") , (44, "Agility") ] } , Species { _name = "Dodrio" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 60 , _baseAtk = 110 , _baseDef = 70 , _baseSpd = 100 , _baseSpc = 60 , _killExp = 158 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (0, "Fury Attack") , (20, "Growl") , (24, "Fury Attack") , (30, "Drill Peck") , (39, "Rage") , (45, "Tri Attack") , (51, "Agility") ] } , Species { _name = "Seel" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 65 , _baseAtk = 45 , _baseDef = 55 , _baseSpd = 45 , _baseSpc = 70 , _killExp = 100 , _learnset = mkLearnset [ (0, "Headbutt") , (30, "Growl") , (35, "Aurora Beam") , (40, "Rest") , (45, "Take Down") , (50, "Ice Beam") ] } , Species { _name = "Dewgong" , _expCurve = Medium , _type1 = Water , _type2 = Just Ice , _baseHP = 90 , _baseAtk = 70 , _baseDef = 80 , _baseSpd = 70 , _baseSpc = 95 , _killExp = 176 , _learnset = mkLearnset [ (0, "Headbutt") , (0, "Growl") , (0, "Aurora Beam") , (30, "Growl") , (35, "Aurora Beam") , (44, "Rest") , (50, "Take Down") , (56, "Ice Beam") ] } , Species { _name = "Grimer" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 80 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 25 , _baseSpc = 40 , _killExp = 90 , _learnset = mkLearnset [ (0, "Pound") , (0, "Disable") , (30, "Poison Gas") , (33, "Minimize") , (37, "Sludge") , (42, "Harden") , (48, "Screech") , (55, "Acid Armor") ] } , Species { _name = "Muk" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 105 , _baseAtk = 105 , _baseDef = 75 , _baseSpd = 50 , _baseSpc = 65 , _killExp = 157 , _learnset = mkLearnset [ (0, "Pound") , (0, "Disable") , (0, "Poison Gas") , (30, "Poison Gas") , (33, "Minimize") , (37, "Sludge") , (45, "Harden") , (53, "Screech") , (60, "Acid Armor") ] } , Species { _name = "Shellder" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 65 , _baseDef = 100 , _baseSpd = 40 , _baseSpc = 45 , _killExp = 97 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Withdraw") , (18, "Supersonic") , (23, "Clamp") , (30, "Aurora Beam") , (39, "Leer") , (50, "Ice Beam") ] } , Species { _name = "Cloyster" , _expCurve = Slow , _type1 = Water , _type2 = Just Ice , _baseHP = 50 , _baseAtk = 95 , _baseDef = 180 , _baseSpd = 70 , _baseSpc = 85 , _killExp = 203 , _learnset = mkLearnset [ (0, "Withdraw") , (0, "Supersonic") , (0, "Clamp") , (0, "Aurora Beam") , (50, "Spike Cannon") ] } , Species { _name = "Gastly" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 30 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 95 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (27, "Hypnosis") , (35, "Dream Eater") ] } , Species { _name = "Haunter" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 50 , _baseDef = 45 , _baseSpd = 95 , _baseSpc = 115 , _killExp = 126 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (29, "Hypnosis") , (38, "Dream Eater") ] } , Species { _name = "Gengar" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 110 , _baseSpc = 130 , _killExp = 190 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (29, "Hypnosis") , (38, "Dream Eater") ] } , Species { _name = "Onix" , _expCurve = Medium , _type1 = Rock , _type2 = Just Ground , _baseHP = 35 , _baseAtk = 45 , _baseDef = 160 , _baseSpd = 70 , _baseSpc = 30 , _killExp = 108 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (15, "Bind") , (19, "Rock Throw") , (25, "Rage") , (33, "Slam") , (43, "Harden") ] } , Species { _name = "Drowzee" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 60 , _baseAtk = 48 , _baseDef = 45 , _baseSpd = 42 , _baseSpc = 90 , _killExp = 102 , _learnset = mkLearnset [ (0, "Pound") , (0, "Hypnosis") , (12, "Disable") , (17, "Confusion") , (24, "Headbutt") , (29, "Poison Gas") , (32, "Psychic") , (37, "Meditate") ] } , Species { _name = "Hypno" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 85 , _baseAtk = 73 , _baseDef = 70 , _baseSpd = 67 , _baseSpc = 115 , _killExp = 165 , _learnset = mkLearnset [ (0, "Pound") , (0, "Hypnosis") , (0, "Disable") , (0, "Confusion") , (12, "Disable") , (17, "Confusion") , (24, "Headbutt") , (33, "Poison Gas") , (37, "Psychic") , (43, "Meditate") ] } , Species { _name = "Krabby" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 105 , _baseDef = 90 , _baseSpd = 50 , _baseSpc = 25 , _killExp = 115 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Leer") , (20, "Vicegrip") , (25, "Guillotine") , (30, "Stomp") , (35, "Crabhammer") , (40, "Harden") ] } , Species { _name = "Kingler" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 55 , _baseAtk = 130 , _baseDef = 115 , _baseSpd = 75 , _baseSpc = 50 , _killExp = 206 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Leer") , (0, "Vicegrip") , (20, "Vicegrip") , (25, "Guillotine") , (34, "Stomp") , (42, "Crabhammer") , (49, "Harden") ] } , Species { _name = "Voltorb" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 40 , _baseAtk = 30 , _baseDef = 50 , _baseSpd = 100 , _baseSpc = 55 , _killExp = 103 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (17, "Sonicboom") , (22, "Selfdestruct") , (29, "Light Screen") , (36, "Swift") , (43, "Explosion") ] } , Species { _name = "Electrode" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 60 , _baseAtk = 50 , _baseDef = 70 , _baseSpd = 140 , _baseSpc = 80 , _killExp = 150 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (0, "Sonicboom") , (17, "Sonicboom") , (22, "Selfdestruct") , (29, "Light Screen") , (40, "Swift") , (50, "Explosion") ] } , Species { _name = "Exeggcute" , _expCurve = Slow , _type1 = Grass , _type2 = Just Psychic , _baseHP = 60 , _baseAtk = 40 , _baseDef = 80 , _baseSpd = 40 , _baseSpc = 60 , _killExp = 98 , _learnset = mkLearnset [ (0, "Barrage") , (0, "Hypnosis") , (25, "Reflect") , (28, "Leech Seed") , (32, "Stun Spore") , (37, "Poisonpowder") , (42, "Solarbeam") , (48, "Sleep Powder") ] } , Species { _name = "Exeggutor" , _expCurve = Slow , _type1 = Grass , _type2 = Just Psychic , _baseHP = 95 , _baseAtk = 95 , _baseDef = 85 , _baseSpd = 55 , _baseSpc = 125 , _killExp = 212 , _learnset = mkLearnset [ (0, "Barrage") , (0, "Hypnosis") , (28, "Stomp") ] } , Species { _name = "Cubone" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 50 , _baseAtk = 50 , _baseDef = 95 , _baseSpd = 35 , _baseSpc = 40 , _killExp = 87 , _learnset = mkLearnset [ (0, "Bone Club") , (0, "Growl") , (25, "Leer") , (31, "Focus Energy") , (38, "Thrash") , (43, "Bonemerang") , (46, "Rage") ] } , Species { _name = "Marowak" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 60 , _baseAtk = 80 , _baseDef = 110 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 124 , _learnset = mkLearnset [ (0, "Bone Club") , (0, "Growl") , (0, "Leer") , (0, "Focus Energy") , (25, "Leer") , (33, "Focus Energy") , (41, "Thrash") , (48, "Bonemerang") , (55, "Rage") ] } , Species { _name = "Hitmonlee" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 50 , _baseAtk = 120 , _baseDef = 53 , _baseSpd = 87 , _baseSpc = 35 , _killExp = 139 , _learnset = mkLearnset [ (0, "Double Kick") , (0, "Meditate") , (33, "Rolling Kick") , (38, "Jump Kick") , (43, "Focus Energy") , (48, "Hi Jump Kick") , (53, "Mega Kick") ] } , Species { _name = "Hitmonchan" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 50 , _baseAtk = 105 , _baseDef = 79 , _baseSpd = 76 , _baseSpc = 35 , _killExp = 140 , _learnset = mkLearnset [ (0, "Comet Punch") , (0, "Agility") , (33, "Fire Punch") , (38, "Ice Punch") , (43, "Thunderpunch") , (48, "Mega Punch") , (53, "Counter") ] } , Species { _name = "Lickitung" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 90 , _baseAtk = 55 , _baseDef = 75 , _baseSpd = 30 , _baseSpc = 60 , _killExp = 127 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Supersonic") , (7, "Stomp") , (15, "Disable") , (23, "Defense Curl") , (31, "Slam") , (39, "Screech") ] } , Species { _name = "Koffing" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 40 , _baseAtk = 65 , _baseDef = 95 , _baseSpd = 35 , _baseSpc = 60 , _killExp = 114 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Smog") , (32, "Sludge") , (37, "Smokescreen") , (40, "Selfdestruct") , (45, "Haze") , (48, "Explosion") ] } , Species { _name = "Weezing" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 65 , _baseAtk = 90 , _baseDef = 120 , _baseSpd = 60 , _baseSpc = 85 , _killExp = 173 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Smog") , (0, "Sludge") , (32, "Sludge") , (39, "Smokescreen") , (43, "Selfdestruct") , (49, "Haze") , (51, "Explosion") ] } , Species { _name = "Rhyhorn" , _expCurve = Slow , _type1 = Ground , _type2 = Just Rock , _baseHP = 80 , _baseAtk = 85 , _baseDef = 95 , _baseSpd = 25 , _baseSpc = 30 , _killExp = 135 , _learnset = mkLearnset [ (0, "Horn Attack") , (30, "Stomp") , (35, "Tail Whip") , (40, "Fury Attack") , (45, "Horn Drill") , (50, "Leer") , (55, "Take Down") ] } , Species { _name = "Rhydon" , _expCurve = Slow , _type1 = Ground , _type2 = Just Rock , _baseHP = 105 , _baseAtk = 130 , _baseDef = 120 , _baseSpd = 40 , _baseSpc = 45 , _killExp = 204 , _learnset = mkLearnset [ (0, "Horn Attack") , (0, "Stomp") , (0, "Tail Whip") , (0, "Fury Attack") , (30, "Stomp") , (35, "Tail Whip") , (40, "Fury Attack") , (48, "Horn Drill") , (55, "Leer") , (64, "Take Down") ] } , Species { _name = "Chansey" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 250 , _baseAtk = 5 , _baseDef = 5 , _baseSpd = 50 , _baseSpc = 105 , _killExp = 255 , _learnset = mkLearnset [ (0, "Pound") , (0, "Doubleslap") , (24, "Sing") , (30, "Growl") , (38, "Minimize") , (44, "Defense Curl") , (48, "Light Screen") , (54, "Double Edge") ] } , Species { _name = "Tangela" , _expCurve = Medium , _type1 = Grass , _type2 = Nothing , _baseHP = 65 , _baseAtk = 55 , _baseDef = 115 , _baseSpd = 60 , _baseSpc = 100 , _killExp = 166 , _learnset = mkLearnset [ (0, "Constrict") , (0, "Bind") , (29, "Absorb") , (32, "Poisonpowder") , (36, "Stun Spore") , (39, "Sleep Powder") , (45, "Slam") , (49, "Growth") ] } , Species { _name = "Kangaskhan" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 105 , _baseAtk = 95 , _baseDef = 80 , _baseSpd = 90 , _baseSpc = 40 , _killExp = 175 , _learnset = mkLearnset [ (0, "Comet Punch") , (0, "Rage") , (26, "Bite") , (31, "Tail Whip") , (36, "Mega Punch") , (41, "Leer") , (46, "Dizzy Punch") ] } , Species { _name = "Horsea" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 40 , _baseDef = 70 , _baseSpd = 60 , _baseSpc = 70 , _killExp = 83 , _learnset = mkLearnset [ (0, "Bubble") , (19, "Smokescreen") , (24, "Leer") , (30, "Water Gun") , (37, "Agility") , (45, "Hydro Pump") ] } , Species { _name = "Seadra" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 55 , _baseAtk = 65 , _baseDef = 95 , _baseSpd = 85 , _baseSpc = 95 , _killExp = 155 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Smokescreen") , (19, "Smokescreen") , (24, "Leer") , (30, "Water Gun") , (41, "Agility") , (52, "Hydro Pump") ] } , Species { _name = "Goldeen" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 45 , _baseAtk = 67 , _baseDef = 60 , _baseSpd = 63 , _baseSpc = 50 , _killExp = 111 , _learnset = mkLearnset [ (0, "Peck") , (0, "Tail Whip") , (19, "Supersonic") , (24, "Horn Attack") , (30, "Fury Attack") , (37, "Waterfall") , (45, "Horn Drill") , (54, "Agility") ] } , Species { _name = "Seaking" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 80 , _baseAtk = 92 , _baseDef = 65 , _baseSpd = 68 , _baseSpc = 80 , _killExp = 170 , _learnset = mkLearnset [ (0, "Peck") , (0, "Tail Whip") , (0, "Supersonic") , (19, "Supersonic") , (24, "Horn Attack") , (30, "Fury Attack") , (39, "Waterfall") , (48, "Horn Drill") , (54, "Agility") ] } , Species { _name = "Staryu" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 45 , _baseDef = 55 , _baseSpd = 85 , _baseSpc = 70 , _killExp = 106 , _learnset = mkLearnset [ (0, "Tackle") , (17, "Water Gun") , (22, "Harden") , (27, "Recover") , (32, "Swift") , (37, "Minimize") , (42, "Light Screen") , (47, "Hydro Pump") ] } , Species { _name = "Starmie" , _expCurve = Slow , _type1 = Water , _type2 = Just Psychic , _baseHP = 60 , _baseAtk = 75 , _baseDef = 85 , _baseSpd = 115 , _baseSpc = 100 , _killExp = 207 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Water Gun") , (0, "Harden") ] } , Species { _name = "MrMime" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 40 , _baseAtk = 45 , _baseDef = 65 , _baseSpd = 90 , _baseSpc = 100 , _killExp = 136 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Barrier") , (15, "Confusion") , (23, "Light Screen") , (31, "Doubleslap") , (39, "Meditate") , (47, "Substitute") ] } , Species { _name = "Scyther" , _expCurve = Medium , _type1 = Bug , _type2 = Just Flying , _baseHP = 70 , _baseAtk = 110 , _baseDef = 80 , _baseSpd = 105 , _baseSpc = 55 , _killExp = 187 , _learnset = mkLearnset [ (0, "Quick Attack") , (17, "Leer") , (20, "Focus Energy") , (24, "Double Team") , (29, "Slash") , (35, "Swords Dance") , (42, "Agility") ] } , Species { _name = "Jynx" , _expCurve = Medium , _type1 = Ice , _type2 = Just Psychic , _baseHP = 65 , _baseAtk = 50 , _baseDef = 35 , _baseSpd = 95 , _baseSpc = 95 , _killExp = 137 , _learnset = mkLearnset [ (0, "Pound") , (0, "Lovely Kiss") , (18, "Lick") , (23, "Doubleslap") , (31, "Ice Punch") , (39, "Body Slam") , (47, "Thrash") , (58, "Blizzard") ] } , Species { _name = "Electabuzz" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 65 , _baseAtk = 83 , _baseDef = 57 , _baseSpd = 105 , _baseSpc = 85 , _killExp = 156 , _learnset = mkLearnset [ (0, "Quick Attack") , (0, "Leer") , (34, "Thundershock") , (37, "Screech") , (42, "Thunderpunch") , (49, "Light Screen") , (54, "Thunder") ] } , Species { _name = "Magmar" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 95 , _baseDef = 57 , _baseSpd = 93 , _baseSpc = 85 , _killExp = 167 , _learnset = mkLearnset [ (0, "Ember") , (36, "Leer") , (39, "Confuse Ray") , (43, "Fire Punch") , (48, "Smokescreen") , (52, "Smog") , (55, "Flamethrower") ] } , Species { _name = "Pinsir" , _expCurve = Slow , _type1 = Bug , _type2 = Nothing , _baseHP = 65 , _baseAtk = 125 , _baseDef = 100 , _baseSpd = 85 , _baseSpc = 55 , _killExp = 200 , _learnset = mkLearnset [ (0, "Vicegrip") , (25, "Seismic Toss") , (30, "Guillotine") , (36, "Focus Energy") , (43, "Harden") , (49, "Slash") , (54, "Swords Dance") ] } , Species { _name = "Tauros" , _expCurve = Slow , _type1 = Normal , _type2 = Nothing , _baseHP = 75 , _baseAtk = 100 , _baseDef = 95 , _baseSpd = 110 , _baseSpc = 70 , _killExp = 211 , _learnset = mkLearnset [ (0, "Tackle") , (21, "Stomp") , (28, "Tail Whip") , (35, "Leer") , (44, "Rage") , (51, "Take Down") ] } , Species { _name = "Magikarp" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 20 , _baseAtk = 10 , _baseDef = 55 , _baseSpd = 80 , _baseSpc = 20 , _killExp = 20 , _learnset = mkLearnset [ (0, "Splash") , (15, "Tackle") ] } , Species { _name = "Gyarados" , _expCurve = Slow , _type1 = Water , _type2 = Just Flying , _baseHP = 95 , _baseAtk = 125 , _baseDef = 79 , _baseSpd = 81 , _baseSpc = 100 , _killExp = 214 , _learnset = mkLearnset [ (0, "Bite") , (0, "Dragon Rage") , (0, "Leer") , (0, "Hydro Pump") , (20, "Bite") , (25, "Dragon Rage") , (32, "Leer") , (41, "Hydro Pump") , (52, "Hyper Beam") ] } , Species { _name = "Lapras" , _expCurve = Slow , _type1 = Water , _type2 = Just Ice , _baseHP = 130 , _baseAtk = 85 , _baseDef = 80 , _baseSpd = 60 , _baseSpc = 95 , _killExp = 219 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Growl") , (16, "Sing") , (20, "Mist") , (25, "Body Slam") , (31, "Confuse Ray") , (38, "Ice Beam") , (46, "Hydro Pump") ] } , Species { _name = "Ditto" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 48 , _baseAtk = 48 , _baseDef = 48 , _baseSpd = 48 , _baseSpc = 48 , _killExp = 61 , _learnset = mkLearnset [ (0, "Transform") ] } , Species { _name = "Eevee" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 55 , _baseAtk = 55 , _baseDef = 50 , _baseSpd = 55 , _baseSpc = 65 , _killExp = 92 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (27, "Quick Attack") , (31, "Tail Whip") , (37, "Bite") , (45, "Take Down") ] } , Species { _name = "Vaporeon" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 130 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 65 , _baseSpc = 110 , _killExp = 196 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Water Gun") , (27, "Quick Attack") , (31, "Water Gun") , (37, "Tail Whip") , (40, "Bite") , (42, "Acid Armor") , (44, "Haze") , (48, "Mist") , (54, "Hydro Pump") ] } , Species { _name = "Jolteon" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 65 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 130 , _baseSpc = 110 , _killExp = 197 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Thundershock") , (27, "Quick Attack") , (31, "Thundershock") , (37, "Tail Whip") , (40, "Thunder Wave") , (42, "Double Kick") , (44, "Agility") , (48, "Pin Missile") , (54, "Thunder") ] } , Species { _name = "Flareon" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 130 , _baseDef = 60 , _baseSpd = 65 , _baseSpc = 110 , _killExp = 198 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Ember") , (27, "Quick Attack") , (31, "Ember") , (37, "Tail Whip") , (40, "Bite") , (42, "Leer") , (44, "Fire Spin") , (48, "Rage") , (54, "Flamethrower") ] } , Species { _name = "Porygon" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 65 , _baseAtk = 60 , _baseDef = 70 , _baseSpd = 40 , _baseSpc = 75 , _killExp = 130 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sharpen") , (0, "Conversion") , (23, "Psybeam") , (28, "Recover") , (35, "Agility") , (42, "Tri Attack") ] } , Species { _name = "Omanyte" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 35 , _baseAtk = 40 , _baseDef = 100 , _baseSpd = 35 , _baseSpc = 90 , _killExp = 120 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Withdraw") , (34, "Horn Attack") , (39, "Leer") , (46, "Spike Cannon") , (53, "Hydro Pump") ] } , Species { _name = "Omastar" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 70 , _baseAtk = 60 , _baseDef = 125 , _baseSpd = 55 , _baseSpc = 115 , _killExp = 199 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Withdraw") , (0, "Horn Attack") , (34, "Horn Attack") , (39, "Leer") , (44, "Spike Cannon") , (49, "Hydro Pump") ] } , Species { _name = "Kabuto" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 30 , _baseAtk = 80 , _baseDef = 90 , _baseSpd = 55 , _baseSpc = 45 , _killExp = 119 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Harden") , (34, "Absorb") , (39, "Slash") , (44, "Leer") , (49, "Hydro Pump") ] } , Species { _name = "Kabutops" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 60 , _baseAtk = 115 , _baseDef = 105 , _baseSpd = 80 , _baseSpc = 70 , _killExp = 201 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Harden") , (0, "Absorb") , (34, "Absorb") , (39, "Slash") , (46, "Leer") , (53, "Hydro Pump") ] } , Species { _name = "Aerodactyl" , _expCurve = Slow , _type1 = Rock , _type2 = Just Flying , _baseHP = 80 , _baseAtk = 105 , _baseDef = 65 , _baseSpd = 130 , _baseSpc = 60 , _killExp = 202 , _learnset = mkLearnset [ (0, "Wing Attack") , (0, "Agility") , (33, "Supersonic") , (38, "Bite") , (45, "Take Down") , (54, "Hyper Beam") ] } , Species { _name = "Snorlax" , _expCurve = Slow , _type1 = Normal , _type2 = Nothing , _baseHP = 160 , _baseAtk = 110 , _baseDef = 65 , _baseSpd = 30 , _baseSpc = 65 , _killExp = 154 , _learnset = mkLearnset [ (0, "Headbutt") , (0, "Amnesia") , (0, "Rest") , (35, "Body Slam") , (41, "Harden") , (48, "Double Edge") , (56, "Hyper Beam") ] } , Species { _name = "Articuno" , _expCurve = Slow , _type1 = Ice , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 85 , _baseDef = 100 , _baseSpd = 85 , _baseSpc = 125 , _killExp = 215 , _learnset = mkLearnset [ (0, "Peck") , (0, "Ice Beam") , (51, "Blizzard") , (55, "Agility") , (60, "Mist") ] } , Species { _name = "Zapdos" , _expCurve = Slow , _type1 = Electric , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 90 , _baseDef = 85 , _baseSpd = 100 , _baseSpc = 125 , _killExp = 216 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Drill Peck") , (51, "Thunder") , (55, "Agility") , (60, "Light Screen") ] } , Species { _name = "Moltres" , _expCurve = Slow , _type1 = Fire , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 100 , _baseDef = 90 , _baseSpd = 90 , _baseSpc = 125 , _killExp = 217 , _learnset = mkLearnset [ (0, "Peck") , (0, "Fire Spin") , (51, "Leer") , (55, "Agility") , (60, "Sky Attack") ] } , Species { _name = "Dratini" , _expCurve = Slow , _type1 = Dragon , _type2 = Nothing , _baseHP = 41 , _baseAtk = 64 , _baseDef = 45 , _baseSpd = 50 , _baseSpc = 50 , _killExp = 67 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (10, "Thunder Wave") , (20, "Agility") , (30, "Slam") , (40, "Dragon Rage") , (50, "Hyper Beam") ] } , Species { _name = "Dragonair" , _expCurve = Slow , _type1 = Dragon , _type2 = Nothing , _baseHP = 61 , _baseAtk = 84 , _baseDef = 65 , _baseSpd = 70 , _baseSpc = 70 , _killExp = 144 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Thunder Wave") , (10, "Thunder Wave") , (20, "Agility") , (35, "Slam") , (45, "Dragon Rage") , (55, "Hyper Beam") ] } , Species { _name = "Dragonite" , _expCurve = Slow , _type1 = Dragon , _type2 = Just Flying , _baseHP = 91 , _baseAtk = 134 , _baseDef = 95 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 218 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Thunder Wave") , (0, "Agility") , (10, "Thunder Wave") , (20, "Agility") , (35, "Slam") , (45, "Dragon Rage") , (60, "Hyper Beam") ] } , Species { _name = "Mewtwo" , _expCurve = Slow , _type1 = Psychic , _type2 = Nothing , _baseHP = 106 , _baseAtk = 110 , _baseDef = 90 , _baseSpd = 130 , _baseSpc = 154 , _killExp = 220 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Disable") , (0, "Swift") , (0, "Psychic") , (63, "Barrier") , (66, "Psychic") , (70, "Recover") , (75, "Mist") , (81, "Amnesia") ] } , Species { _name = "Mew" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 100 , _baseAtk = 100 , _baseDef = 100 , _baseSpd = 100 , _baseSpc = 100 , _killExp = 64 , _learnset = mkLearnset [ (0, "Pound") , (10, "Transform") , (20, "Mega Punch") , (30, "Metronome") , (40, "Psychic") ] } ]
85,563
allSpecies = [ Species { _name = "Bulbasaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 49 , _baseDef = 49 , _baseSpd = 45 , _baseSpc = 65 , _killExp = 64 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (7, "Leech Seed") , (13, "Vine Whip") , (20, "Poisonpowder") , (27, "Razor Leaf") , (34, "Growth") , (41, "Sleep Powder") , (48, "Solarbeam") ] } , Species { _name = "Ivysaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 62 , _baseDef = 63 , _baseSpd = 60 , _baseSpc = 80 , _killExp = 141 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (0, "Leech Seed") , (7, "Leech Seed") , (13, "Vine Whip") , (22, "Poisonpowder") , (30, "Razor Leaf") , (38, "Growth") , (46, "Sleep Powder") , (54, "Solarbeam") ] } , Species { _name = "Venusaur" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 82 , _baseDef = 83 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 208 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Growl") , (0, "Leech Seed") , (0, "Vine Whip") , (7, "Leech Seed") , (13, "Vine Whip") , (22, "Poisonpowder") , (30, "Razor Leaf") , (43, "Growth") , (55, "Sleep Powder") , (65, "Solarbeam") ] } , Species { _name = "Charmander" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Nothing , _baseHP = 39 , _baseAtk = 52 , _baseDef = 43 , _baseSpd = 65 , _baseSpc = 50 , _killExp = 65 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (9, "Ember") , (15, "Leer") , (22, "Rage") , (30, "Slash") , (38, "Flamethrower") , (46, "Fire Spin") ] } , Species { _name = "Charmeleon" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Nothing , _baseHP = 58 , _baseAtk = 64 , _baseDef = 58 , _baseSpd = 80 , _baseSpc = 65 , _killExp = 142 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Ember") , (9, "Ember") , (15, "Leer") , (24, "Rage") , (33, "Slash") , (42, "Flamethrower") , (56, "Fire Spin") ] } , Species { _name = "Charizard" , _expCurve = MediumSlow , _type1 = Fire , _type2 = Just Flying , _baseHP = 78 , _baseAtk = 84 , _baseDef = 78 , _baseSpd = 100 , _baseSpc = 85 , _killExp = 209 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Ember") , (0, "Leer") , (9, "Ember") , (15, "Leer") , (24, "Rage") , (36, "Slash") , (46, "Flamethrower") , (55, "Fire Spin") ] } , Species { _name = "Squirtle" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 44 , _baseAtk = 48 , _baseDef = 65 , _baseSpd = 43 , _baseSpc = 50 , _killExp = 66 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (8, "Bubble") , (15, "Water Gun") , (22, "Bite") , (28, "Withdraw") , (35, "Skull Bash") , (42, "Hydro Pump") ] } , Species { _name = "Wartortle" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 59 , _baseAtk = 63 , _baseDef = 80 , _baseSpd = 58 , _baseSpc = 65 , _killExp = 143 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Bubble") , (8, "Bubble") , (15, "Water Gun") , (24, "Bite") , (31, "Withdraw") , (39, "Skull Bash") , (47, "Hydro Pump") ] } , Species { _name = "Blastoise" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 79 , _baseAtk = 83 , _baseDef = 100 , _baseSpd = 78 , _baseSpc = 85 , _killExp = 210 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Bubble") , (0, "Water Gun") , (8, "Bubble") , (15, "Water Gun") , (24, "Bite") , (31, "Withdraw") , (42, "Skull Bash") , (52, "Hydro Pump") ] } , Species { _name = "Caterpie" , _expCurve = Medium , _type1 = Bug , _type2 = Nothing , _baseHP = 45 , _baseAtk = 30 , _baseDef = 35 , _baseSpd = 45 , _baseSpc = 20 , _killExp = 53 , _learnset = mkLearnset [ (0, "Tackle") , (0, "String Shot") ] } , Species { _name = "Metapod" , _expCurve = Medium , _type1 = Bug , _type2 = Nothing , _baseHP = 50 , _baseAtk = 20 , _baseDef = 55 , _baseSpd = 30 , _baseSpc = 25 , _killExp = 72 , _learnset = mkLearnset [ (0, "Harden") ] } , Species { _name = "Butterfree" , _expCurve = Medium , _type1 = Bug , _type2 = Just Flying , _baseHP = 60 , _baseAtk = 45 , _baseDef = 50 , _baseSpd = 70 , _baseSpc = 80 , _killExp = 160 , _learnset = mkLearnset [ (0, "Confusion") , (12, "Confusion") , (15, "Poisonpowder") , (16, "Stun Spore") , (17, "Sleep Powder") , (21, "Supersonic") , (26, "Whirlwind") , (32, "Psybeam") ] } , Species { _name = "Weedle" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 40 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 50 , _baseSpc = 20 , _killExp = 52 , _learnset = mkLearnset [ (0, "Poison Sting") , (0, "String Shot") ] } , Species { _name = "Kakuna" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 25 , _baseDef = 50 , _baseSpd = 35 , _baseSpc = 25 , _killExp = 71 , _learnset = mkLearnset [ (0, "Harden") ] } , Species { _name = "Beedrill" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 65 , _baseAtk = 80 , _baseDef = 40 , _baseSpd = 75 , _baseSpc = 45 , _killExp = 159 , _learnset = mkLearnset [ (0, "Fury Attack") , (12, "Fury Attack") , (16, "Focus Energy") , (20, "Twineedle") , (25, "Rage") , (30, "Pin Missile") , (35, "Agility") ] } , Species { _name = "Pidgey" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 45 , _baseDef = 40 , _baseSpd = 56 , _baseSpc = 35 , _killExp = 55 , _learnset = mkLearnset [ (0, "Gust") , (5, "Sand Attack") , (12, "Quick Attack") , (19, "Whirlwind") , (28, "Wing Attack") , (36, "Agility") , (44, "Mirror Move") ] } , Species { _name = "Pidgeotto" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 63 , _baseAtk = 60 , _baseDef = 55 , _baseSpd = 71 , _baseSpc = 50 , _killExp = 113 , _learnset = mkLearnset [ (0, "Gust") , (0, "Sand Attack") , (5, "Sand Attack") , (12, "Quick Attack") , (21, "Whirlwind") , (31, "Wing Attack") , (40, "Agility") , (49, "Mirror Move") ] } , Species { _name = "Pidgeot" , _expCurve = MediumSlow , _type1 = Normal , _type2 = Just Flying , _baseHP = 83 , _baseAtk = 80 , _baseDef = 75 , _baseSpd = 91 , _baseSpc = 70 , _killExp = 172 , _learnset = mkLearnset [ (0, "Gust") , (0, "Sand Attack") , (0, "Quick Attack") , (5, "Sand Attack") , (12, "Quick Attack") , (21, "Whirlwind") , (31, "Wing Attack") , (44, "Agility") , (54, "Mirror Move") ] } , Species { _name = "Rattata" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 30 , _baseAtk = 56 , _baseDef = 35 , _baseSpd = 72 , _baseSpc = 25 , _killExp = 57 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (7, "Quick Attack") , (14, "Hyper Fang") , (23, "Focus Energy") , (34, "Super Fang") ] } , Species { _name = "Raticate" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 55 , _baseAtk = 81 , _baseDef = 60 , _baseSpd = 97 , _baseSpc = 50 , _killExp = 116 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Tail Whip") , (0, "Quick Attack") , (7, "Quick Attack") , (14, "Hyper Fang") , (27, "Focus Energy") , (41, "Super Fang")] } , Species { _name = "Spearow" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 60 , _baseDef = 30 , _baseSpd = 70 , _baseSpc = 31 , _killExp = 58 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (9, "Leer") , (15, "Fury Attack") , (22, "Mirror Move") , (29, "Drill Peck") , (36, "Agility") ] } , Species { _name = "Fearow" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 65 , _baseAtk = 90 , _baseDef = 65 , _baseSpd = 100 , _baseSpc = 61 , _killExp = 162 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (0, "Leer") , (9, "Leer") , (15, "Fury Attack") , (25, "Mirror Move") , (34, "Drill Peck") , (43, "Agility") ] } , Species { _name = "Ekans" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 35 , _baseAtk = 60 , _baseDef = 44 , _baseSpd = 55 , _baseSpc = 40 , _killExp = 62 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (10, "Poison Sting") , (17, "Bite") , (24, "Glare") , (31, "Screech") , (38, "Acid") ] } , Species { _name = "Arbok" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 60 , _baseAtk = 85 , _baseDef = 69 , _baseSpd = 80 , _baseSpc = 65 , _killExp = 147 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Poison Sting") , (10, "Poison Sting") , (17, "Bite") , (27, "Glare") , (36, "Screech") , (47, "Acid") ] } , Species { _name = "Pikachu" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 35 , _baseAtk = 55 , _baseDef = 30 , _baseSpd = 90 , _baseSpc = 50 , _killExp = 82 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Growl") , (9, "Thunder Wave") , (16, "Quick Attack") , (26, "Swift") , (33, "Agility") , (43, "Thunder") ] } , Species { _name = "Raichu" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 60 , _baseAtk = 90 , _baseDef = 55 , _baseSpd = 100 , _baseSpc = 90 , _killExp = 122 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Growl") , (0, "Thunder Wave") ] } , Species { _name = "Sandshrew" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 50 , _baseAtk = 75 , _baseDef = 85 , _baseSpd = 40 , _baseSpc = 30 , _killExp = 93 , _learnset = mkLearnset [ (0, "Scratch") , (10, "Sand Attack") , (17, "Slash") , (24, "Poison Sting") , (31, "Swift") , (38, "Fury Swipes") ] } , Species { _name = "Sandslash" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 75 , _baseAtk = 100 , _baseDef = 110 , _baseSpd = 65 , _baseSpc = 55 , _killExp = 163 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Sand Attack") , (10, "Sand Attack") , (17, "Slash") , (27, "Poison Sting") , (36, "Swift") , (47, "Fury Swipes") ] } , Species { _name = "NidoranF" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 55 , _baseAtk = 47 , _baseDef = 52 , _baseSpd = 41 , _baseSpc = 40 , _killExp = 59 , _learnset = mkLearnset [ (0, "Growl") , (0, "Tackle") , (8, "Scratch") , (14, "Poison Sting") , (21, "Tail Whip") , (29, "Bite") , (36, "Fury Swipes") , (43, "Double Kick") ] } , Species { _name = "Nidorina" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 70 , _baseAtk = 62 , _baseDef = 67 , _baseSpd = 56 , _baseSpc = 55 , _killExp = 117 , _learnset = mkLearnset [ (0, "Growl") , (0, "Tackle") , (0, "Scratch") , (8, "Scratch") , (14, "Poison Sting") , (23, "Tail Whip") , (32, "Bite") , (41, "Fury Swipes") , (50, "Double Kick") ] } , Species { _name = "Nidoqueen" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Just Ground , _baseHP = 90 , _baseAtk = 82 , _baseDef = 87 , _baseSpd = 76 , _baseSpc = 75 , _killExp = 194 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Scratch") , (0, "Tail Whip") , (0, "Body Slam") , (8, "Scratch") , (14, "Poison Sting") , (23, "Body Slam") ] } , Species { _name = "NidoranM" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 46 , _baseAtk = 57 , _baseDef = 40 , _baseSpd = 50 , _baseSpc = 40 , _killExp = 60 , _learnset = mkLearnset [ (0, "Leer") , (0, "Tackle") , (8, "Horn Attack") , (14, "Poison Sting") , (21, "Focus Energy") , (29, "Fury Attack") , (36, "Horn Drill") , (43, "Double Kick") ] } , Species { _name = "Nidorino" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Nothing , _baseHP = 61 , _baseAtk = 72 , _baseDef = 57 , _baseSpd = 65 , _baseSpc = 55 , _killExp = 118 , _learnset = mkLearnset [ (0, "Leer") , (0, "Tackle") , (0, "Horn Attack") , (8, "Horn Attack") , (14, "Poison Sting") , (23, "Focus Energy") , (32, "Fury Attack") , (41, "Horn Drill") , (50, "Double Kick") ] } , Species { _name = "Nidoking" , _expCurve = MediumSlow , _type1 = Poison , _type2 = Just Ground , _baseHP = 81 , _baseAtk = 92 , _baseDef = 77 , _baseSpd = 85 , _baseSpc = 75 , _killExp = 195 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Horn Attack") , (0, "Poison Sting") , (0, "Thrash") , (8, "Horn Attack") , (14, "Poison Sting") , (23, "Thrash") ] } , Species { _name = "Clefairy" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 70 , _baseAtk = 45 , _baseDef = 48 , _baseSpd = 35 , _baseSpc = 60 , _killExp = 68 , _learnset = mkLearnset [ (0, "Pound") , (0, "Growl") , (13, "Sing") , (18, "Doubleslap") , (24, "Minimize") , (31, "Metronome") , (39, "Defense Curl") , (48, "Light Screen") ] } , Species { _name = "Clefable" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 95 , _baseAtk = 70 , _baseDef = 73 , _baseSpd = 60 , _baseSpc = 85 , _killExp = 129 , _learnset = mkLearnset [ (0, "Sing") , (0, "Doubleslap") , (0, "Minimize") , (0, "Metronome") ] } , Species { _name = "Vulpix" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 38 , _baseAtk = 41 , _baseDef = 40 , _baseSpd = 65 , _baseSpc = 65 , _killExp = 63 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (16, "Quick Attack") , (21, "Roar") , (28, "Confuse Ray") , (35, "Flamethrower") , (42, "Fire Spin") ] } , Species { _name = "Ninetales" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 73 , _baseAtk = 76 , _baseDef = 75 , _baseSpd = 100 , _baseSpc = 100 , _killExp = 178 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (0, "Quick Attack") , (0, "Roar") ] } , Species { _name = "Jigglypuff" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 115 , _baseAtk = 45 , _baseDef = 20 , _baseSpd = 20 , _baseSpc = 25 , _killExp = 76 , _learnset = mkLearnset [ (0, "Sing") , (9, "Pound") , (14, "Disable") , (19, "Defense Curl") , (24, "Doubleslap") , (29, "Rest") , (34, "Body Slam") , (39, "Double Edge") ] } , Species { _name = "Wigglytuff" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 140 , _baseAtk = 70 , _baseDef = 45 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 109 , _learnset = mkLearnset [ (0, "Sing") , (0, "Disable") , (0, "Defense Curl") , (0, "Doubleslap") ] } , Species { _name = "Zubat" , _expCurve = Medium , _type1 = Poison , _type2 = Just Flying , _baseHP = 40 , _baseAtk = 45 , _baseDef = 35 , _baseSpd = 55 , _baseSpc = 40 , _killExp = 54 , _learnset = mkLearnset [ (0, "Leech Life") , (10, "Supersonic") , (15, "Bite") , (21, "Confuse Ray") , (28, "Wing Attack") , (36, "Haze") ] } , Species { _name = "Golbat" , _expCurve = Medium , _type1 = Poison , _type2 = Just Flying , _baseHP = 75 , _baseAtk = 80 , _baseDef = 70 , _baseSpd = 90 , _baseSpc = 75 , _killExp = 171 , _learnset = mkLearnset [ (0, "Leech Life") , (0, "Screech") , (0, "Bite") , (10, "Supersonic") , (15, "Bite") , (21, "Confuse Ray") , (32, "Wing Attack") , (43, "Haze") ] } , Species { _name = "Oddish" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 50 , _baseDef = 55 , _baseSpd = 30 , _baseSpc = 75 , _killExp = 78 , _learnset = mkLearnset [ (0, "Absorb") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") , (24, "Acid") , (33, "Petal Dance") , (46, "Solarbeam") ] } , Species { _name = "Gloom" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 65 , _baseDef = 70 , _baseSpd = 40 , _baseSpc = 85 , _killExp = 132 , _learnset = mkLearnset [ (0, "Absorb") , (0, "Poisonpowder") , (0, "Stun Spore") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") , (28, "Acid") , (38, "Petal Dance") , (52, "Solarbeam") ] } , Species { _name = "Vileplume" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 75 , _baseAtk = 80 , _baseDef = 85 , _baseSpd = 50 , _baseSpc = 100 , _killExp = 184 , _learnset = mkLearnset [ (0, "Stun Spore") , (0, "Sleep Powder") , (0, "Acid") , (0, "Petal Dance") , (15, "Poisonpowder") , (17, "Stun Spore") , (19, "Sleep Powder") ] } , Species { _name = "Paras" , _expCurve = Medium , _type1 = Bug , _type2 = Just Grass , _baseHP = 35 , _baseAtk = 70 , _baseDef = 55 , _baseSpd = 25 , _baseSpc = 55 , _killExp = 70 , _learnset = mkLearnset [ (0, "Scratch") , (13, "Stun Spore") , (20, "Leech Life") , (27, "Spore") , (34, "Slash") , (41, "Growth") ] } , Species { _name = "Parasect" , _expCurve = Medium , _type1 = Bug , _type2 = Just Grass , _baseHP = 60 , _baseAtk = 95 , _baseDef = 80 , _baseSpd = 30 , _baseSpc = 80 , _killExp = 128 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Stun Spore") , (0, "Leech Life") , (13, "Stun Spore") , (20, "Leech Life") , (30, "Spore") , (39, "Slash") , (48, "Growth") ] } , Species { _name = "Venonat" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 55 , _baseDef = 50 , _baseSpd = 45 , _baseSpc = 40 , _killExp = 75 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Disable") , (24, "Poisonpowder") , (27, "Leech Life") , (30, "Stun Spore") , (35, "Psybeam") , (38, "Sleep Powder") , (43, "Psychic") ] } , Species { _name = "Venomoth" , _expCurve = Medium , _type1 = Bug , _type2 = Just Poison , _baseHP = 70 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 90 , _baseSpc = 90 , _killExp = 138 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Disable") , (0, "Poisonpowder") , (0, "Leech Life") , (24, "Poisonpowder") , (27, "Leech Life") , (30, "Stun Spore") , (38, "Psybeam") , (43, "Sleep Powder") , (50, "Psychic") ] } , Species { _name = "Diglett" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 10 , _baseAtk = 55 , _baseDef = 25 , _baseSpd = 95 , _baseSpc = 45 , _killExp = 81 , _learnset = mkLearnset [ (0, "Scratch") , (15, "Growl") , (19, "Dig") , (24, "Sand Attack") , (31, "Slash") , (40, "Earthquake") ] } , Species { _name = "Dugtrio" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 35 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 120 , _baseSpc = 70 , _killExp = 153 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Dig") , (15, "Growl") , (19, "Dig") , (24, "Sand Attack") , (35, "Slash") , (47, "Earthquake") ] } , Species { _name = "Meowth" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 40 , _baseAtk = 45 , _baseDef = 35 , _baseSpd = 90 , _baseSpc = 45 , _killExp = 69 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (12, "Bite") , (17, "Pay Day") , (24, "Screech") , (33, "Fury Swipes") , (44, "Slash") ] } , Species { _name = "Persian" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 65 , _baseAtk = 70 , _baseDef = 60 , _baseSpd = 115 , _baseSpc = 65 , _killExp = 148 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Growl") , (0, "Bite") , (0, "Screech") , (12, "Bite") , (17, "Pay Day") , (24, "Screech") , (37, "Fury Swipes") , (51, "Slash") ] } , Species { _name = "Psyduck" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 50 , _baseAtk = 52 , _baseDef = 48 , _baseSpd = 55 , _baseSpc = 50 , _killExp = 80 , _learnset = mkLearnset [ (0, "Scratch") , (28, "Tail Whip") , (31, "Disable") , (36, "Confusion") , (43, "Fury Swipes") , (52, "Hydro Pump") ] } , Species { _name = "Golduck" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 80 , _baseAtk = 82 , _baseDef = 78 , _baseSpd = 85 , _baseSpc = 80 , _killExp = 174 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Tail Whip") , (0, "Disable") , (28, "Tail Whip") , (31, "Disable") , (39, "Confusion") , (48, "Fury Swipes") , (59, "Hydro Pump") ] } , Species { _name = "Mankey" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 40 , _baseAtk = 80 , _baseDef = 35 , _baseSpd = 70 , _baseSpc = 35 , _killExp = 74 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Leer") , (15, "Karate Chop") , (21, "Fury Swipes") , (27, "Focus Energy") , (33, "Seismic Toss") , (39, "Thrash") ] } , Species { _name = "Primeape" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 65 , _baseAtk = 105 , _baseDef = 60 , _baseSpd = 95 , _baseSpc = 60 , _killExp = 149 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Leer") , (0, "Karate Chop") , (0, "Fury Swipes") , (15, "Karate Chop") , (21, "Fury Swipes") , (27, "Focus Energy") , (37, "Seismic Toss") , (46, "Thrash") ] } , Species { _name = "Growlithe" , _expCurve = Slow , _type1 = Fire , _type2 = Nothing , _baseHP = 55 , _baseAtk = 70 , _baseDef = 45 , _baseSpd = 60 , _baseSpc = 50 , _killExp = 91 , _learnset = mkLearnset [ (0, "Bite") , (0, "Roar") , (18, "Ember") , (23, "Leer") , (30, "Take Down") , (39, "Agility") , (50, "Flamethrower") ] } , Species { _name = "Arcanine" , _expCurve = Slow , _type1 = Fire , _type2 = Nothing , _baseHP = 90 , _baseAtk = 110 , _baseDef = 80 , _baseSpd = 95 , _baseSpc = 80 , _killExp = 213 , _learnset = mkLearnset [ (0, "Roar") , (0, "Ember") , (0, "Leer") , (0, "Take Down") ] } , Species { _name = "Poliwag" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 40 , _baseAtk = 50 , _baseDef = 40 , _baseSpd = 90 , _baseSpc = 40 , _killExp = 77 , _learnset = mkLearnset [ (0, "Bubble") , (16, "Hypnosis") , (19, "Water Gun") , (25, "Doubleslap") , (31, "Body Slam") , (38, "Amnesia") , (45, "Hydro Pump") ] } , Species { _name = "Poliwhirl" , _expCurve = MediumSlow , _type1 = Water , _type2 = Nothing , _baseHP = 65 , _baseAtk = 65 , _baseDef = 65 , _baseSpd = 90 , _baseSpc = 50 , _killExp = 131 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Hypnosis") , (0, "Water Gun") , (16, "Hypnosis") , (19, "Water Gun") , (26, "Doubleslap") , (33, "Body Slam") , (41, "Amnesia") , (49, "Hydro Pump") ] } , Species { _name = "Poliwrath" , _expCurve = MediumSlow , _type1 = Water , _type2 = Just Fighting , _baseHP = 90 , _baseAtk = 85 , _baseDef = 95 , _baseSpd = 70 , _baseSpc = 70 , _killExp = 185 , _learnset = mkLearnset [ (0, "Hypnosis") , (0, "Water Gun") , (0, "Doubleslap") , (0, "Body Slam") , (16, "Hypnosis") , (19, "Water Gun") ] } , Species { _name = "Abra" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 25 , _baseAtk = 20 , _baseDef = 15 , _baseSpd = 90 , _baseSpc = 105 , _killExp = 73 , _learnset = mkLearnset [ (0, "Teleport") ] } , Species { _name = "Kadabra" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 40 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 105 , _baseSpc = 120 , _killExp = 145 , _learnset = mkLearnset [ (0, "Teleport") , (0, "Confusion") , (0, "Disable") , (16, "Confusion") , (20, "Disable") , (27, "Psybeam") , (31, "Recover") , (38, "Psychic") , (42, "Reflect") ] } , Species { _name = "Alakazam" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 55 , _baseAtk = 50 , _baseDef = 45 , _baseSpd = 120 , _baseSpc = 135 , _killExp = 186 , _learnset = mkLearnset [ (0, "Teleport") , (0, "Confusion") , (0, "Disable") , (16, "Confusion") , (20, "Disable") , (27, "Psybeam") , (31, "Recover") , (38, "Psychic") , (42, "Reflect") ] } , Species { _name = "Machop" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 70 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 35 , _baseSpc = 35 , _killExp = 88 , _learnset = mkLearnset [ (0, "Karate Chop") , (20, "Low Kick") , (25, "Leer") , (32, "Focus Energy") , (39, "Seismic Toss") , (46, "Submission") ] } , Species { _name = "Machoke" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 80 , _baseAtk = 100 , _baseDef = 70 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 146 , _learnset = mkLearnset [ (0, "Karate Chop") , (0, "Low Kick") , (0, "Leer") , (20, "Low Kick") , (25, "Leer") , (36, "Focus Energy") , (44, "Seismic Toss") , (52, "Submission") ] } , Species { _name = "Machamp" , _expCurve = MediumSlow , _type1 = Fighting , _type2 = Nothing , _baseHP = 90 , _baseAtk = 130 , _baseDef = 80 , _baseSpd = 55 , _baseSpc = 65 , _killExp = 193 , _learnset = mkLearnset [ (0, "Karate Chop") , (0, "Low Kick") , (0, "Leer") , (20, "Low Kick") , (25, "Leer") , (36, "Focus Energy") , (44, "Seismic Toss") , (52, "Submission") ] } , Species { _name = "Bellsprout" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 50 , _baseAtk = 75 , _baseDef = 35 , _baseSpd = 40 , _baseSpc = 70 , _killExp = 84 , _learnset = mkLearnset [ (0, "Vine Whip") , (0, "Growth") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") , (21, "Stun Spore") , (26, "Acid") , (33, "Razor Leaf") , (42, "Slam") ] } , Species { _name = "Weepinbell" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 65 , _baseAtk = 90 , _baseDef = 50 , _baseSpd = 55 , _baseSpc = 85 , _killExp = 151 , _learnset = mkLearnset [ (0, "Vine Whip") , (0, "Growth") , (0, "Wrap") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") , (23, "Stun Spore") , (29, "Acid") , (38, "Razor Leaf") , (49, "Slam") ] } , Species { _name = "Victreebel" , _expCurve = MediumSlow , _type1 = Grass , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 105 , _baseDef = 65 , _baseSpd = 70 , _baseSpc = 100 , _killExp = 191 , _learnset = mkLearnset [ (0, "Sleep Powder") , (0, "Stun Spore") , (0, "Acid") , (0, "Razor Leaf") , (13, "Wrap") , (15, "Poisonpowder") , (18, "Sleep Powder") ] } , Species { _name = "Tentacool" , _expCurve = Slow , _type1 = Water , _type2 = Just Poison , _baseHP = 40 , _baseAtk = 80 , _baseDef = 100 , _baseSpd = 20 , _baseSpc = 30 , _killExp = 105 , _learnset = mkLearnset [ (0, "Acid") , (7, "Supersonic") , (13, "Wrap") , (18, "Poison Sting") , (22, "Water Gun") , (27, "Constrict") , (33, "Barrier") , (40, "Screech") , (48, "Hydro Pump") ] } , Species { _name = "Tentacruel" , _expCurve = Slow , _type1 = Water , _type2 = Just Poison , _baseHP = 80 , _baseAtk = 70 , _baseDef = 65 , _baseSpd = 100 , _baseSpc = 120 , _killExp = 205 , _learnset = mkLearnset [ (0, "Acid") , (0, "Supersonic") , (0, "Wrap") , (7, "Supersonic") , (13, "Wrap") , (18, "Poison Sting") , (22, "Water Gun") , (27, "Constrict") , (35, "Barrier") , (43, "Screech") , (50, "Hydro Pump") ] } , Species { _name = "Geodude" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 40 , _baseAtk = 80 , _baseDef = 100 , _baseSpd = 20 , _baseSpc = 30 , _killExp = 86 , _learnset = mkLearnset [ (0, "Tackle") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (26, "Harden") , (31, "Earthquake") , (36, "Explosion") ] } , Species { _name = "Graveler" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 55 , _baseAtk = 95 , _baseDef = 115 , _baseSpd = 35 , _baseSpc = 45 , _killExp = 134 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Defense Curl") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (29, "Harden") , (36, "Earthquake") , (43, "Explosion") ] } , Species { _name = "Golem" , _expCurve = MediumSlow , _type1 = Rock , _type2 = Just Ground , _baseHP = 80 , _baseAtk = 110 , _baseDef = 130 , _baseSpd = 45 , _baseSpc = 55 , _killExp = 177 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Defense Curl") , (11, "Defense Curl") , (16, "Rock Throw") , (21, "Selfdestruct") , (29, "Harden") , (36, "Earthquake") , (43, "Explosion") ] } , Species { _name = "Ponyta" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 50 , _baseAtk = 85 , _baseDef = 55 , _baseSpd = 90 , _baseSpc = 65 , _killExp = 152 , _learnset = mkLearnset [ (0, "Ember") , (30, "Tail Whip") , (32, "Stomp") , (35, "Growl") , (39, "Fire Spin") , (43, "Take Down") , (48, "Agility") ] } , Species { _name = "Rapidash" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 100 , _baseDef = 70 , _baseSpd = 105 , _baseSpc = 80 , _killExp = 192 , _learnset = mkLearnset [ (0, "Ember") , (0, "Tail Whip") , (0, "Stomp") , (0, "Growl") , (30, "Tail Whip") , (32, "Stomp") , (35, "Growl") , (39, "Fire Spin") , (47, "Take Down") , (55, "Agility") ] } , Species { _name = "Slowpoke" , _expCurve = Medium , _type1 = Water , _type2 = Just Psychic , _baseHP = 90 , _baseAtk = 65 , _baseDef = 65 , _baseSpd = 15 , _baseSpc = 40 , _killExp = 99 , _learnset = mkLearnset [ (0, "Confusion") , (18, "Disable") , (22, "Headbutt") , (27, "Growl") , (33, "Water Gun") , (40, "Amnesia") , (48, "Psychic") ] } , Species { _name = "Slowbro" , _expCurve = Medium , _type1 = Water , _type2 = Just Psychic , _baseHP = 95 , _baseAtk = 75 , _baseDef = 110 , _baseSpd = 30 , _baseSpc = 80 , _killExp = 164 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Disable") , (0, "Headbutt") , (18, "Disable") , (22, "Headbutt") , (27, "Growl") , (33, "Water Gun") , (37, "Withdraw") , (44, "Amnesia") , (55, "Psychic") ] } , Species { _name = "Magnemite" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 25 , _baseAtk = 35 , _baseDef = 70 , _baseSpd = 45 , _baseSpc = 95 , _killExp = 89 , _learnset = mkLearnset [ (0, "Tackle") , (21, "Sonicboom") , (25, "Thundershock") , (29, "Supersonic") , (35, "Thunder Wave") , (41, "Swift") , (47, "Screech") ] } , Species { _name = "Magneton" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 50 , _baseAtk = 60 , _baseDef = 95 , _baseSpd = 70 , _baseSpc = 120 , _killExp = 169 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sonicboom") , (0, "Thundershock") , (21, "Sonicboom") , (25, "Thundershock") , (29, "Supersonic") , (38, "Thunder Wave") , (46, "Swift") , (54, "Screech") ] } , Species { _name = "Farfetchd" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 52 , _baseAtk = 65 , _baseDef = 55 , _baseSpd = 60 , _baseSpc = 58 , _killExp = 94 , _learnset = mkLearnset [ (0, "Peck") , (0, "Sand Attack") , (7, "Leer") , (15, "Fury Attack") , (23, "Swords Dance") , (31, "Agility") , (39, "Slash") ] } , Species { _name = "Doduo" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 35 , _baseAtk = 85 , _baseDef = 45 , _baseSpd = 75 , _baseSpc = 35 , _killExp = 96 , _learnset = mkLearnset [ (0, "Peck") , (20, "Growl") , (24, "Fury Attack") , (30, "Drill Peck") , (36, "Rage") , (40, "Tri Attack") , (44, "Agility") ] } , Species { _name = "Dodrio" , _expCurve = Medium , _type1 = Normal , _type2 = Just Flying , _baseHP = 60 , _baseAtk = 110 , _baseDef = 70 , _baseSpd = 100 , _baseSpc = 60 , _killExp = 158 , _learnset = mkLearnset [ (0, "Peck") , (0, "Growl") , (0, "Fury Attack") , (20, "Growl") , (24, "Fury Attack") , (30, "Drill Peck") , (39, "Rage") , (45, "Tri Attack") , (51, "Agility") ] } , Species { _name = "Seel" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 65 , _baseAtk = 45 , _baseDef = 55 , _baseSpd = 45 , _baseSpc = 70 , _killExp = 100 , _learnset = mkLearnset [ (0, "Headbutt") , (30, "Growl") , (35, "Aurora Beam") , (40, "Rest") , (45, "Take Down") , (50, "Ice Beam") ] } , Species { _name = "Dewgong" , _expCurve = Medium , _type1 = Water , _type2 = Just Ice , _baseHP = 90 , _baseAtk = 70 , _baseDef = 80 , _baseSpd = 70 , _baseSpc = 95 , _killExp = 176 , _learnset = mkLearnset [ (0, "Headbutt") , (0, "Growl") , (0, "Aurora Beam") , (30, "Growl") , (35, "Aurora Beam") , (44, "Rest") , (50, "Take Down") , (56, "Ice Beam") ] } , Species { _name = "Grimer" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 80 , _baseAtk = 80 , _baseDef = 50 , _baseSpd = 25 , _baseSpc = 40 , _killExp = 90 , _learnset = mkLearnset [ (0, "Pound") , (0, "Disable") , (30, "Poison Gas") , (33, "Minimize") , (37, "Sludge") , (42, "Harden") , (48, "Screech") , (55, "Acid Armor") ] } , Species { _name = "Muk" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 105 , _baseAtk = 105 , _baseDef = 75 , _baseSpd = 50 , _baseSpc = 65 , _killExp = 157 , _learnset = mkLearnset [ (0, "Pound") , (0, "Disable") , (0, "Poison Gas") , (30, "Poison Gas") , (33, "Minimize") , (37, "Sludge") , (45, "Harden") , (53, "Screech") , (60, "Acid Armor") ] } , Species { _name = "Shellder" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 65 , _baseDef = 100 , _baseSpd = 40 , _baseSpc = 45 , _killExp = 97 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Withdraw") , (18, "Supersonic") , (23, "Clamp") , (30, "Aurora Beam") , (39, "Leer") , (50, "Ice Beam") ] } , Species { _name = "Cloyster" , _expCurve = Slow , _type1 = Water , _type2 = Just Ice , _baseHP = 50 , _baseAtk = 95 , _baseDef = 180 , _baseSpd = 70 , _baseSpc = 85 , _killExp = 203 , _learnset = mkLearnset [ (0, "Withdraw") , (0, "Supersonic") , (0, "Clamp") , (0, "Aurora Beam") , (50, "Spike Cannon") ] } , Species { _name = "Gastly" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 30 , _baseAtk = 35 , _baseDef = 30 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 95 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (27, "Hypnosis") , (35, "Dream Eater") ] } , Species { _name = "Haunter" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 45 , _baseAtk = 50 , _baseDef = 45 , _baseSpd = 95 , _baseSpc = 115 , _killExp = 126 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (29, "Hypnosis") , (38, "Dream Eater") ] } , Species { _name = "Gengar" , _expCurve = MediumSlow , _type1 = Ghost , _type2 = Just Poison , _baseHP = 60 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 110 , _baseSpc = 130 , _killExp = 190 , _learnset = mkLearnset [ (0, "Lick") , (0, "Confuse Ray") , (0, "Night Shade") , (29, "Hypnosis") , (38, "Dream Eater") ] } , Species { _name = "Onix" , _expCurve = Medium , _type1 = Rock , _type2 = Just Ground , _baseHP = 35 , _baseAtk = 45 , _baseDef = 160 , _baseSpd = 70 , _baseSpc = 30 , _killExp = 108 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (15, "Bind") , (19, "Rock Throw") , (25, "Rage") , (33, "Slam") , (43, "Harden") ] } , Species { _name = "Drowzee" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 60 , _baseAtk = 48 , _baseDef = 45 , _baseSpd = 42 , _baseSpc = 90 , _killExp = 102 , _learnset = mkLearnset [ (0, "Pound") , (0, "Hypnosis") , (12, "Disable") , (17, "Confusion") , (24, "Headbutt") , (29, "Poison Gas") , (32, "Psychic") , (37, "Meditate") ] } , Species { _name = "Hypno" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 85 , _baseAtk = 73 , _baseDef = 70 , _baseSpd = 67 , _baseSpc = 115 , _killExp = 165 , _learnset = mkLearnset [ (0, "Pound") , (0, "Hypnosis") , (0, "Disable") , (0, "Confusion") , (12, "Disable") , (17, "Confusion") , (24, "Headbutt") , (33, "Poison Gas") , (37, "Psychic") , (43, "Meditate") ] } , Species { _name = "Krabby" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 105 , _baseDef = 90 , _baseSpd = 50 , _baseSpc = 25 , _killExp = 115 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Leer") , (20, "Vicegrip") , (25, "Guillotine") , (30, "Stomp") , (35, "Crabhammer") , (40, "Harden") ] } , Species { _name = "Kingler" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 55 , _baseAtk = 130 , _baseDef = 115 , _baseSpd = 75 , _baseSpc = 50 , _killExp = 206 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Leer") , (0, "Vicegrip") , (20, "Vicegrip") , (25, "Guillotine") , (34, "Stomp") , (42, "Crabhammer") , (49, "Harden") ] } , Species { _name = "Voltorb" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 40 , _baseAtk = 30 , _baseDef = 50 , _baseSpd = 100 , _baseSpc = 55 , _killExp = 103 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (17, "Sonicboom") , (22, "Selfdestruct") , (29, "Light Screen") , (36, "Swift") , (43, "Explosion") ] } , Species { _name = "Electrode" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 60 , _baseAtk = 50 , _baseDef = 70 , _baseSpd = 140 , _baseSpc = 80 , _killExp = 150 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Screech") , (0, "Sonicboom") , (17, "Sonicboom") , (22, "Selfdestruct") , (29, "Light Screen") , (40, "Swift") , (50, "Explosion") ] } , Species { _name = "Exeggcute" , _expCurve = Slow , _type1 = Grass , _type2 = Just Psychic , _baseHP = 60 , _baseAtk = 40 , _baseDef = 80 , _baseSpd = 40 , _baseSpc = 60 , _killExp = 98 , _learnset = mkLearnset [ (0, "Barrage") , (0, "Hypnosis") , (25, "Reflect") , (28, "Leech Seed") , (32, "Stun Spore") , (37, "Poisonpowder") , (42, "Solarbeam") , (48, "Sleep Powder") ] } , Species { _name = "Exeggutor" , _expCurve = Slow , _type1 = Grass , _type2 = Just Psychic , _baseHP = 95 , _baseAtk = 95 , _baseDef = 85 , _baseSpd = 55 , _baseSpc = 125 , _killExp = 212 , _learnset = mkLearnset [ (0, "Barrage") , (0, "Hypnosis") , (28, "Stomp") ] } , Species { _name = "Cubone" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 50 , _baseAtk = 50 , _baseDef = 95 , _baseSpd = 35 , _baseSpc = 40 , _killExp = 87 , _learnset = mkLearnset [ (0, "Bone Club") , (0, "Growl") , (25, "Leer") , (31, "Focus Energy") , (38, "Thrash") , (43, "Bonemerang") , (46, "Rage") ] } , Species { _name = "Marowak" , _expCurve = Medium , _type1 = Ground , _type2 = Nothing , _baseHP = 60 , _baseAtk = 80 , _baseDef = 110 , _baseSpd = 45 , _baseSpc = 50 , _killExp = 124 , _learnset = mkLearnset [ (0, "Bone Club") , (0, "Growl") , (0, "Leer") , (0, "Focus Energy") , (25, "Leer") , (33, "Focus Energy") , (41, "Thrash") , (48, "Bonemerang") , (55, "Rage") ] } , Species { _name = "Hitmonlee" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 50 , _baseAtk = 120 , _baseDef = 53 , _baseSpd = 87 , _baseSpc = 35 , _killExp = 139 , _learnset = mkLearnset [ (0, "Double Kick") , (0, "Meditate") , (33, "Rolling Kick") , (38, "Jump Kick") , (43, "Focus Energy") , (48, "Hi Jump Kick") , (53, "Mega Kick") ] } , Species { _name = "Hitmonchan" , _expCurve = Medium , _type1 = Fighting , _type2 = Nothing , _baseHP = 50 , _baseAtk = 105 , _baseDef = 79 , _baseSpd = 76 , _baseSpc = 35 , _killExp = 140 , _learnset = mkLearnset [ (0, "Comet Punch") , (0, "Agility") , (33, "Fire Punch") , (38, "Ice Punch") , (43, "Thunderpunch") , (48, "Mega Punch") , (53, "Counter") ] } , Species { _name = "Lickitung" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 90 , _baseAtk = 55 , _baseDef = 75 , _baseSpd = 30 , _baseSpc = 60 , _killExp = 127 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Supersonic") , (7, "Stomp") , (15, "Disable") , (23, "Defense Curl") , (31, "Slam") , (39, "Screech") ] } , Species { _name = "Koffing" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 40 , _baseAtk = 65 , _baseDef = 95 , _baseSpd = 35 , _baseSpc = 60 , _killExp = 114 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Smog") , (32, "Sludge") , (37, "Smokescreen") , (40, "Selfdestruct") , (45, "Haze") , (48, "Explosion") ] } , Species { _name = "Weezing" , _expCurve = Medium , _type1 = Poison , _type2 = Nothing , _baseHP = 65 , _baseAtk = 90 , _baseDef = 120 , _baseSpd = 60 , _baseSpc = 85 , _killExp = 173 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Smog") , (0, "Sludge") , (32, "Sludge") , (39, "Smokescreen") , (43, "Selfdestruct") , (49, "Haze") , (51, "Explosion") ] } , Species { _name = "Rhyhorn" , _expCurve = Slow , _type1 = Ground , _type2 = Just Rock , _baseHP = 80 , _baseAtk = 85 , _baseDef = 95 , _baseSpd = 25 , _baseSpc = 30 , _killExp = 135 , _learnset = mkLearnset [ (0, "Horn Attack") , (30, "Stomp") , (35, "Tail Whip") , (40, "Fury Attack") , (45, "Horn Drill") , (50, "Leer") , (55, "Take Down") ] } , Species { _name = "Rhydon" , _expCurve = Slow , _type1 = Ground , _type2 = Just Rock , _baseHP = 105 , _baseAtk = 130 , _baseDef = 120 , _baseSpd = 40 , _baseSpc = 45 , _killExp = 204 , _learnset = mkLearnset [ (0, "Horn Attack") , (0, "Stomp") , (0, "Tail Whip") , (0, "Fury Attack") , (30, "Stomp") , (35, "Tail Whip") , (40, "Fury Attack") , (48, "Horn Drill") , (55, "Leer") , (64, "Take Down") ] } , Species { _name = "Chansey" , _expCurve = Fast , _type1 = Normal , _type2 = Nothing , _baseHP = 250 , _baseAtk = 5 , _baseDef = 5 , _baseSpd = 50 , _baseSpc = 105 , _killExp = 255 , _learnset = mkLearnset [ (0, "Pound") , (0, "Doubleslap") , (24, "Sing") , (30, "Growl") , (38, "Minimize") , (44, "Defense Curl") , (48, "Light Screen") , (54, "Double Edge") ] } , Species { _name = "Tangela" , _expCurve = Medium , _type1 = Grass , _type2 = Nothing , _baseHP = 65 , _baseAtk = 55 , _baseDef = 115 , _baseSpd = 60 , _baseSpc = 100 , _killExp = 166 , _learnset = mkLearnset [ (0, "Constrict") , (0, "Bind") , (29, "Absorb") , (32, "Poisonpowder") , (36, "Stun Spore") , (39, "Sleep Powder") , (45, "Slam") , (49, "Growth") ] } , Species { _name = "Kangaskhan" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 105 , _baseAtk = 95 , _baseDef = 80 , _baseSpd = 90 , _baseSpc = 40 , _killExp = 175 , _learnset = mkLearnset [ (0, "Comet Punch") , (0, "Rage") , (26, "Bite") , (31, "Tail Whip") , (36, "Mega Punch") , (41, "Leer") , (46, "Dizzy Punch") ] } , Species { _name = "Horsea" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 40 , _baseDef = 70 , _baseSpd = 60 , _baseSpc = 70 , _killExp = 83 , _learnset = mkLearnset [ (0, "Bubble") , (19, "Smokescreen") , (24, "Leer") , (30, "Water Gun") , (37, "Agility") , (45, "Hydro Pump") ] } , Species { _name = "Seadra" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 55 , _baseAtk = 65 , _baseDef = 95 , _baseSpd = 85 , _baseSpc = 95 , _killExp = 155 , _learnset = mkLearnset [ (0, "Bubble") , (0, "Smokescreen") , (19, "Smokescreen") , (24, "Leer") , (30, "Water Gun") , (41, "Agility") , (52, "Hydro Pump") ] } , Species { _name = "Goldeen" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 45 , _baseAtk = 67 , _baseDef = 60 , _baseSpd = 63 , _baseSpc = 50 , _killExp = 111 , _learnset = mkLearnset [ (0, "Peck") , (0, "Tail Whip") , (19, "Supersonic") , (24, "Horn Attack") , (30, "Fury Attack") , (37, "Waterfall") , (45, "Horn Drill") , (54, "Agility") ] } , Species { _name = "Seaking" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 80 , _baseAtk = 92 , _baseDef = 65 , _baseSpd = 68 , _baseSpc = 80 , _killExp = 170 , _learnset = mkLearnset [ (0, "Peck") , (0, "Tail Whip") , (0, "Supersonic") , (19, "Supersonic") , (24, "Horn Attack") , (30, "Fury Attack") , (39, "Waterfall") , (48, "Horn Drill") , (54, "Agility") ] } , Species { _name = "Staryu" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 30 , _baseAtk = 45 , _baseDef = 55 , _baseSpd = 85 , _baseSpc = 70 , _killExp = 106 , _learnset = mkLearnset [ (0, "Tackle") , (17, "Water Gun") , (22, "Harden") , (27, "Recover") , (32, "Swift") , (37, "Minimize") , (42, "Light Screen") , (47, "Hydro Pump") ] } , Species { _name = "Starmie" , _expCurve = Slow , _type1 = Water , _type2 = Just Psychic , _baseHP = 60 , _baseAtk = 75 , _baseDef = 85 , _baseSpd = 115 , _baseSpc = 100 , _killExp = 207 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Water Gun") , (0, "Harden") ] } , Species { _name = "MrMime" , _expCurve = Medium , _type1 = Psychic , _type2 = Nothing , _baseHP = 40 , _baseAtk = 45 , _baseDef = 65 , _baseSpd = 90 , _baseSpc = 100 , _killExp = 136 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Barrier") , (15, "Confusion") , (23, "Light Screen") , (31, "Doubleslap") , (39, "Meditate") , (47, "Substitute") ] } , Species { _name = "Scyther" , _expCurve = Medium , _type1 = Bug , _type2 = Just Flying , _baseHP = 70 , _baseAtk = 110 , _baseDef = 80 , _baseSpd = 105 , _baseSpc = 55 , _killExp = 187 , _learnset = mkLearnset [ (0, "Quick Attack") , (17, "Leer") , (20, "Focus Energy") , (24, "Double Team") , (29, "Slash") , (35, "Swords Dance") , (42, "Agility") ] } , Species { _name = "Jynx" , _expCurve = Medium , _type1 = Ice , _type2 = Just Psychic , _baseHP = 65 , _baseAtk = 50 , _baseDef = 35 , _baseSpd = 95 , _baseSpc = 95 , _killExp = 137 , _learnset = mkLearnset [ (0, "Pound") , (0, "Lovely Kiss") , (18, "Lick") , (23, "Doubleslap") , (31, "Ice Punch") , (39, "Body Slam") , (47, "Thrash") , (58, "Blizzard") ] } , Species { _name = "Electabuzz" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 65 , _baseAtk = 83 , _baseDef = 57 , _baseSpd = 105 , _baseSpc = 85 , _killExp = 156 , _learnset = mkLearnset [ (0, "Quick Attack") , (0, "Leer") , (34, "Thundershock") , (37, "Screech") , (42, "Thunderpunch") , (49, "Light Screen") , (54, "Thunder") ] } , Species { _name = "Magmar" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 95 , _baseDef = 57 , _baseSpd = 93 , _baseSpc = 85 , _killExp = 167 , _learnset = mkLearnset [ (0, "Ember") , (36, "Leer") , (39, "Confuse Ray") , (43, "Fire Punch") , (48, "Smokescreen") , (52, "Smog") , (55, "Flamethrower") ] } , Species { _name = "Pinsir" , _expCurve = Slow , _type1 = Bug , _type2 = Nothing , _baseHP = 65 , _baseAtk = 125 , _baseDef = 100 , _baseSpd = 85 , _baseSpc = 55 , _killExp = 200 , _learnset = mkLearnset [ (0, "Vicegrip") , (25, "Seismic Toss") , (30, "Guillotine") , (36, "Focus Energy") , (43, "Harden") , (49, "Slash") , (54, "Swords Dance") ] } , Species { _name = "Tauros" , _expCurve = Slow , _type1 = Normal , _type2 = Nothing , _baseHP = 75 , _baseAtk = 100 , _baseDef = 95 , _baseSpd = 110 , _baseSpc = 70 , _killExp = 211 , _learnset = mkLearnset [ (0, "Tackle") , (21, "Stomp") , (28, "Tail Whip") , (35, "Leer") , (44, "Rage") , (51, "Take Down") ] } , Species { _name = "Magikarp" , _expCurve = Slow , _type1 = Water , _type2 = Nothing , _baseHP = 20 , _baseAtk = 10 , _baseDef = 55 , _baseSpd = 80 , _baseSpc = 20 , _killExp = 20 , _learnset = mkLearnset [ (0, "Splash") , (15, "Tackle") ] } , Species { _name = "Gyarados" , _expCurve = Slow , _type1 = Water , _type2 = Just Flying , _baseHP = 95 , _baseAtk = 125 , _baseDef = 79 , _baseSpd = 81 , _baseSpc = 100 , _killExp = 214 , _learnset = mkLearnset [ (0, "Bite") , (0, "Dragon Rage") , (0, "Leer") , (0, "Hydro Pump") , (20, "Bite") , (25, "Dragon Rage") , (32, "Leer") , (41, "Hydro Pump") , (52, "Hyper Beam") ] } , Species { _name = "Lapras" , _expCurve = Slow , _type1 = Water , _type2 = Just Ice , _baseHP = 130 , _baseAtk = 85 , _baseDef = 80 , _baseSpd = 60 , _baseSpc = 95 , _killExp = 219 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Growl") , (16, "Sing") , (20, "Mist") , (25, "Body Slam") , (31, "Confuse Ray") , (38, "Ice Beam") , (46, "Hydro Pump") ] } , Species { _name = "Ditto" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 48 , _baseAtk = 48 , _baseDef = 48 , _baseSpd = 48 , _baseSpc = 48 , _killExp = 61 , _learnset = mkLearnset [ (0, "Transform") ] } , Species { _name = "Eevee" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 55 , _baseAtk = 55 , _baseDef = 50 , _baseSpd = 55 , _baseSpc = 65 , _killExp = 92 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (27, "Quick Attack") , (31, "Tail Whip") , (37, "Bite") , (45, "Take Down") ] } , Species { _name = "Vaporeon" , _expCurve = Medium , _type1 = Water , _type2 = Nothing , _baseHP = 130 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 65 , _baseSpc = 110 , _killExp = 196 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Water Gun") , (27, "Quick Attack") , (31, "Water Gun") , (37, "Tail Whip") , (40, "Bite") , (42, "Acid Armor") , (44, "Haze") , (48, "Mist") , (54, "Hydro Pump") ] } , Species { _name = "Jolteon" , _expCurve = Medium , _type1 = Electric , _type2 = Nothing , _baseHP = 65 , _baseAtk = 65 , _baseDef = 60 , _baseSpd = 130 , _baseSpc = 110 , _killExp = 197 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Thundershock") , (27, "Quick Attack") , (31, "Thundershock") , (37, "Tail Whip") , (40, "Thunder Wave") , (42, "Double Kick") , (44, "Agility") , (48, "Pin Missile") , (54, "Thunder") ] } , Species { _name = "Flareon" , _expCurve = Medium , _type1 = Fire , _type2 = Nothing , _baseHP = 65 , _baseAtk = 130 , _baseDef = 60 , _baseSpd = 65 , _baseSpc = 110 , _killExp = 198 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sand Attack") , (0, "Quick Attack") , (0, "Ember") , (27, "Quick Attack") , (31, "Ember") , (37, "Tail Whip") , (40, "Bite") , (42, "Leer") , (44, "Fire Spin") , (48, "Rage") , (54, "Flamethrower") ] } , Species { _name = "Porygon" , _expCurve = Medium , _type1 = Normal , _type2 = Nothing , _baseHP = 65 , _baseAtk = 60 , _baseDef = 70 , _baseSpd = 40 , _baseSpc = 75 , _killExp = 130 , _learnset = mkLearnset [ (0, "Tackle") , (0, "Sharpen") , (0, "Conversion") , (23, "Psybeam") , (28, "Recover") , (35, "Agility") , (42, "Tri Attack") ] } , Species { _name = "Omanyte" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 35 , _baseAtk = 40 , _baseDef = 100 , _baseSpd = 35 , _baseSpc = 90 , _killExp = 120 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Withdraw") , (34, "Horn Attack") , (39, "Leer") , (46, "Spike Cannon") , (53, "Hydro Pump") ] } , Species { _name = "Omastar" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 70 , _baseAtk = 60 , _baseDef = 125 , _baseSpd = 55 , _baseSpc = 115 , _killExp = 199 , _learnset = mkLearnset [ (0, "Water Gun") , (0, "Withdraw") , (0, "Horn Attack") , (34, "Horn Attack") , (39, "Leer") , (44, "Spike Cannon") , (49, "Hydro Pump") ] } , Species { _name = "Kabuto" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 30 , _baseAtk = 80 , _baseDef = 90 , _baseSpd = 55 , _baseSpc = 45 , _killExp = 119 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Harden") , (34, "Absorb") , (39, "Slash") , (44, "Leer") , (49, "Hydro Pump") ] } , Species { _name = "Kabutops" , _expCurve = Medium , _type1 = Rock , _type2 = Just Water , _baseHP = 60 , _baseAtk = 115 , _baseDef = 105 , _baseSpd = 80 , _baseSpc = 70 , _killExp = 201 , _learnset = mkLearnset [ (0, "Scratch") , (0, "Harden") , (0, "Absorb") , (34, "Absorb") , (39, "Slash") , (46, "Leer") , (53, "Hydro Pump") ] } , Species { _name = "Aerodactyl" , _expCurve = Slow , _type1 = Rock , _type2 = Just Flying , _baseHP = 80 , _baseAtk = 105 , _baseDef = 65 , _baseSpd = 130 , _baseSpc = 60 , _killExp = 202 , _learnset = mkLearnset [ (0, "Wing Attack") , (0, "Agility") , (33, "Supersonic") , (38, "Bite") , (45, "Take Down") , (54, "Hyper Beam") ] } , Species { _name = "Snorlax" , _expCurve = Slow , _type1 = Normal , _type2 = Nothing , _baseHP = 160 , _baseAtk = 110 , _baseDef = 65 , _baseSpd = 30 , _baseSpc = 65 , _killExp = 154 , _learnset = mkLearnset [ (0, "Headbutt") , (0, "Amnesia") , (0, "Rest") , (35, "Body Slam") , (41, "Harden") , (48, "Double Edge") , (56, "Hyper Beam") ] } , Species { _name = "Articuno" , _expCurve = Slow , _type1 = Ice , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 85 , _baseDef = 100 , _baseSpd = 85 , _baseSpc = 125 , _killExp = 215 , _learnset = mkLearnset [ (0, "Peck") , (0, "Ice Beam") , (51, "Blizzard") , (55, "Agility") , (60, "Mist") ] } , Species { _name = "Zapdos" , _expCurve = Slow , _type1 = Electric , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 90 , _baseDef = 85 , _baseSpd = 100 , _baseSpc = 125 , _killExp = 216 , _learnset = mkLearnset [ (0, "Thundershock") , (0, "Drill Peck") , (51, "Thunder") , (55, "Agility") , (60, "Light Screen") ] } , Species { _name = "Moltres" , _expCurve = Slow , _type1 = Fire , _type2 = Just Flying , _baseHP = 90 , _baseAtk = 100 , _baseDef = 90 , _baseSpd = 90 , _baseSpc = 125 , _killExp = 217 , _learnset = mkLearnset [ (0, "Peck") , (0, "Fire Spin") , (51, "Leer") , (55, "Agility") , (60, "Sky Attack") ] } , Species { _name = "Dratini" , _expCurve = Slow , _type1 = Dragon , _type2 = Nothing , _baseHP = 41 , _baseAtk = 64 , _baseDef = 45 , _baseSpd = 50 , _baseSpc = 50 , _killExp = 67 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (10, "Thunder Wave") , (20, "Agility") , (30, "Slam") , (40, "Dragon Rage") , (50, "Hyper Beam") ] } , Species { _name = "Dragonair" , _expCurve = Slow , _type1 = Dragon , _type2 = Nothing , _baseHP = 61 , _baseAtk = 84 , _baseDef = 65 , _baseSpd = 70 , _baseSpc = 70 , _killExp = 144 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Thunder Wave") , (10, "Thunder Wave") , (20, "Agility") , (35, "Slam") , (45, "Dragon Rage") , (55, "Hyper Beam") ] } , Species { _name = "Dragonite" , _expCurve = Slow , _type1 = Dragon , _type2 = Just Flying , _baseHP = 91 , _baseAtk = 134 , _baseDef = 95 , _baseSpd = 80 , _baseSpc = 100 , _killExp = 218 , _learnset = mkLearnset [ (0, "Wrap") , (0, "Leer") , (0, "Thunder Wave") , (0, "Agility") , (10, "Thunder Wave") , (20, "Agility") , (35, "Slam") , (45, "Dragon Rage") , (60, "Hyper Beam") ] } , Species { _name = "Mewtwo" , _expCurve = Slow , _type1 = Psychic , _type2 = Nothing , _baseHP = 106 , _baseAtk = 110 , _baseDef = 90 , _baseSpd = 130 , _baseSpc = 154 , _killExp = 220 , _learnset = mkLearnset [ (0, "Confusion") , (0, "Disable") , (0, "Swift") , (0, "Psychic") , (63, "Barrier") , (66, "Psychic") , (70, "Recover") , (75, "Mist") , (81, "Amnesia") ] } , Species { _name = "Mew" , _expCurve = MediumSlow , _type1 = Psychic , _type2 = Nothing , _baseHP = 100 , _baseAtk = 100 , _baseDef = 100 , _baseSpd = 100 , _baseSpc = 100 , _killExp = 64 , _learnset = mkLearnset [ (0, "Pound") , (10, "Transform") , (20, "Mega Punch") , (30, "Metronome") , (40, "Psychic") ] } ]
85,539
false
true
0
11
43,561
21,191
13,859
7,332
null
null
paulkeene/FP101x
chapter04/Exercises.hs
bsd-3-clause
-- Exercise 10 -- ex10 :: Int ex10 = sum [x | x <- [1..10], even x]
68
ex10 :: Int ex10 = sum [x | x <- [1..10], even x]
49
ex10 = sum [x | x <- [1..10], even x]
37
true
true
0
9
17
45
21
24
null
null