datasets-0.2.3: Classical data sets for statistics and machine learning

Safe HaskellNone
LanguageHaskell98

Numeric.Datasets.Adult

Description

Adult (AKA Census Income) dataset.

UCI ML Repository link http://archive.ics.uci.edu/ml/datasets/Adult

Documentation

data WorkClass Source #

Instances

Eq WorkClass Source # 
Read WorkClass Source # 
Show WorkClass Source # 
Generic WorkClass Source # 

Associated Types

type Rep WorkClass :: * -> * #

FromField WorkClass Source # 
type Rep WorkClass Source # 
type Rep WorkClass = D1 (MetaData "WorkClass" "Numeric.Datasets.Adult" "datasets-0.2.3-7JRxBliwy8yA269qPaa60J" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "Private" PrefixI False) U1) (C1 (MetaCons "SelfEmpNotInc" PrefixI False) U1)) ((:+:) (C1 (MetaCons "SelfEmpInc" PrefixI False) U1) (C1 (MetaCons "FederalGov" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "LocalGov" PrefixI False) U1) (C1 (MetaCons "StateGov" PrefixI False) U1)) ((:+:) (C1 (MetaCons "WithoutPay" PrefixI False) U1) (C1 (MetaCons "NeverWorked" PrefixI False) U1))))

data Occupation Source #

Instances

Eq Occupation Source # 
Read Occupation Source # 
Show Occupation Source # 
Generic Occupation Source # 

Associated Types

type Rep Occupation :: * -> * #

FromField Occupation Source # 
type Rep Occupation Source # 
type Rep Occupation = D1 (MetaData "Occupation" "Numeric.Datasets.Adult" "datasets-0.2.3-7JRxBliwy8yA269qPaa60J" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "TechSupport" PrefixI False) U1) ((:+:) (C1 (MetaCons "CraftRepair" PrefixI False) U1) (C1 (MetaCons "OtherService" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "Sales" PrefixI False) U1) (C1 (MetaCons "ExecManagerial" PrefixI False) U1)) ((:+:) (C1 (MetaCons "ProfSpecialty" PrefixI False) U1) (C1 (MetaCons "HandlersCleaners" PrefixI False) U1)))) ((:+:) ((:+:) (C1 (MetaCons "MachineOpInspct" PrefixI False) U1) ((:+:) (C1 (MetaCons "AdmClerical" PrefixI False) U1) (C1 (MetaCons "FarmingFishing" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "TransportMoving" PrefixI False) U1) (C1 (MetaCons "PrivHouseServ" PrefixI False) U1)) ((:+:) (C1 (MetaCons "ProtectiveServ" PrefixI False) U1) (C1 (MetaCons "ArmedForces" PrefixI False) U1)))))

data Race Source #

Instances

Eq Race Source # 

Methods

(==) :: Race -> Race -> Bool #

(/=) :: Race -> Race -> Bool #

Read Race Source # 
Show Race Source # 

Methods

showsPrec :: Int -> Race -> ShowS #

show :: Race -> String #

showList :: [Race] -> ShowS #

Generic Race Source # 

Associated Types

type Rep Race :: * -> * #

Methods

from :: Race -> Rep Race x #

to :: Rep Race x -> Race #

FromField Race Source # 
type Rep Race Source # 
type Rep Race = D1 (MetaData "Race" "Numeric.Datasets.Adult" "datasets-0.2.3-7JRxBliwy8yA269qPaa60J" False) ((:+:) ((:+:) (C1 (MetaCons "White" PrefixI False) U1) (C1 (MetaCons "AsianPacIslander" PrefixI False) U1)) ((:+:) (C1 (MetaCons "AmerIndianEskimo" PrefixI False) U1) ((:+:) (C1 (MetaCons "Other" PrefixI False) U1) (C1 (MetaCons "Black" PrefixI False) U1))))

data Sex Source #

Constructors

Female 
Male 

Instances

Eq Sex Source # 

Methods

(==) :: Sex -> Sex -> Bool #

(/=) :: Sex -> Sex -> Bool #

Read Sex Source # 
Show Sex Source # 

Methods

showsPrec :: Int -> Sex -> ShowS #

show :: Sex -> String #

showList :: [Sex] -> ShowS #

Generic Sex Source # 

Associated Types

type Rep Sex :: * -> * #

Methods

from :: Sex -> Rep Sex x #

to :: Rep Sex x -> Sex #

FromField Sex Source # 

Methods

parseField :: Field -> Parser Sex #

type Rep Sex Source # 
type Rep Sex = D1 (MetaData "Sex" "Numeric.Datasets.Adult" "datasets-0.2.3-7JRxBliwy8yA269qPaa60J" False) ((:+:) (C1 (MetaCons "Female" PrefixI False) U1) (C1 (MetaCons "Male" PrefixI False) U1))

data Income Source #

Constructors

GT50K 
LE50K 

Instances

Eq Income Source # 

Methods

(==) :: Income -> Income -> Bool #

(/=) :: Income -> Income -> Bool #

Read Income Source # 
Show Income Source # 
Generic Income Source # 

Associated Types

type Rep Income :: * -> * #

Methods

from :: Income -> Rep Income x #

to :: Rep Income x -> Income #

FromField Income Source # 
type Rep Income Source # 
type Rep Income = D1 (MetaData "Income" "Numeric.Datasets.Adult" "datasets-0.2.3-7JRxBliwy8yA269qPaa60J" False) ((:+:) (C1 (MetaCons "GT50K" PrefixI False) U1) (C1 (MetaCons "LE50K" PrefixI False) U1))

data Adult Source #

Instances

Read Adult Source # 
Show Adult Source # 

Methods

showsPrec :: Int -> Adult -> ShowS #

show :: Adult -> String #

showList :: [Adult] -> ShowS #

Generic Adult Source # 

Associated Types

type Rep Adult :: * -> * #

Methods

from :: Adult -> Rep Adult x #

to :: Rep Adult x -> Adult #

FromRecord Adult Source # 
type Rep Adult Source # 
type Rep Adult = D1 (MetaData "Adult" "Numeric.Datasets.Adult" "datasets-0.2.3-7JRxBliwy8yA269qPaa60J" False) (C1 (MetaCons "Adult" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "age") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)) ((:*:) (S1 (MetaSel (Just Symbol "workClass") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe WorkClass))) (S1 (MetaSel (Just Symbol "finalWeight") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "education") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) (S1 (MetaSel (Just Symbol "educationNum") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))) ((:*:) (S1 (MetaSel (Just Symbol "maritalStatus") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 MaritalStatus)) (S1 (MetaSel (Just Symbol "occupation") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Occupation)))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "relationship") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Relationship)) (S1 (MetaSel (Just Symbol "race") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Race))) ((:*:) (S1 (MetaSel (Just Symbol "sex") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Sex)) (S1 (MetaSel (Just Symbol "capitalGain") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "capitalLoss") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)) (S1 (MetaSel (Just Symbol "hoursPerWeek") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))) ((:*:) (S1 (MetaSel (Just Symbol "nativeCountry") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) (S1 (MetaSel (Just Symbol "income") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Income)))))))