gogol-civicinfo-0.1.0: Google Civic Information SDK.

Copyright(c) 2015-2016 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay@gmail.com>
Stabilityauto-generated
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.Google.CivicInfo.Types

Contents

Description

 

Synopsis

Service Configuration

civicInfoService :: ServiceConfig Source #

Default request referring to version v2 of the Google Civic Information API. This contains the host and root path used as a starting point for constructing service requests.

RepresentativeInfoResponseDivisions

data RepresentativeInfoResponseDivisions Source #

Political geographic divisions that contain the requested address.

See: representativeInfoResponseDivisions smart constructor.

Instances

Eq RepresentativeInfoResponseDivisions Source # 
Data RepresentativeInfoResponseDivisions Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativeInfoResponseDivisions -> c RepresentativeInfoResponseDivisions #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativeInfoResponseDivisions #

toConstr :: RepresentativeInfoResponseDivisions -> Constr #

dataTypeOf :: RepresentativeInfoResponseDivisions -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativeInfoResponseDivisions) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativeInfoResponseDivisions) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativeInfoResponseDivisions -> RepresentativeInfoResponseDivisions #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoResponseDivisions -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoResponseDivisions -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativeInfoResponseDivisions -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativeInfoResponseDivisions -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativeInfoResponseDivisions -> m RepresentativeInfoResponseDivisions #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoResponseDivisions -> m RepresentativeInfoResponseDivisions #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoResponseDivisions -> m RepresentativeInfoResponseDivisions #

Show RepresentativeInfoResponseDivisions Source # 
Generic RepresentativeInfoResponseDivisions Source # 
ToJSON RepresentativeInfoResponseDivisions Source # 
FromJSON RepresentativeInfoResponseDivisions Source # 
type Rep RepresentativeInfoResponseDivisions Source # 
type Rep RepresentativeInfoResponseDivisions = D1 (MetaData "RepresentativeInfoResponseDivisions" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" True) (C1 (MetaCons "RepresentativeInfoResponseDivisions'" PrefixI True) (S1 (MetaSel (Just Symbol "_rirdAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text GeographicDivision))))

representativeInfoResponseDivisions Source #

Creates a value of RepresentativeInfoResponseDivisions with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rirdAddtional :: Lens' RepresentativeInfoResponseDivisions (HashMap Text GeographicDivision) Source #

The unique Open Civic Data identifier for this division.

VoterInfoResponse

data VoterInfoResponse Source #

The result of a voter info lookup query.

See: voterInfoResponse smart constructor.

Instances

Eq VoterInfoResponse Source # 
Data VoterInfoResponse Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VoterInfoResponse -> c VoterInfoResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VoterInfoResponse #

toConstr :: VoterInfoResponse -> Constr #

dataTypeOf :: VoterInfoResponse -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c VoterInfoResponse) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VoterInfoResponse) #

gmapT :: (forall b. Data b => b -> b) -> VoterInfoResponse -> VoterInfoResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VoterInfoResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VoterInfoResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> VoterInfoResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VoterInfoResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VoterInfoResponse -> m VoterInfoResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VoterInfoResponse -> m VoterInfoResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VoterInfoResponse -> m VoterInfoResponse #

Show VoterInfoResponse Source # 
Generic VoterInfoResponse Source # 
ToJSON VoterInfoResponse Source # 
FromJSON VoterInfoResponse Source # 
type Rep VoterInfoResponse Source # 
type Rep VoterInfoResponse = D1 (MetaData "VoterInfoResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "VoterInfoResponse'" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_virOtherElections") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Election]))) (S1 (MetaSel (Just Symbol "_virContests") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Contest])))) ((:*:) (S1 (MetaSel (Just Symbol "_virState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AdministrationRegion]))) ((:*:) (S1 (MetaSel (Just Symbol "_virKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_virDropOffLocations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PollingLocation])))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_virElection") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Election))) ((:*:) (S1 (MetaSel (Just Symbol "_virNormalizedInput") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType))) (S1 (MetaSel (Just Symbol "_virMailOnly") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) ((:*:) (S1 (MetaSel (Just Symbol "_virEarlyVoteSites") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PollingLocation]))) ((:*:) (S1 (MetaSel (Just Symbol "_virPollingLocations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PollingLocation]))) (S1 (MetaSel (Just Symbol "_virPrecinctId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

voterInfoResponse :: VoterInfoResponse Source #

Creates a value of VoterInfoResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

virOtherElections :: Lens' VoterInfoResponse [Election] Source #

If no election ID was specified in the query, and there was more than one election with data for the given voter, this will contain information about the other elections that could apply.

virContests :: Lens' VoterInfoResponse [Contest] Source #

Contests that will appear on the voter's ballot.

virState :: Lens' VoterInfoResponse [AdministrationRegion] Source #

Local Election Information for the state that the voter votes in. For the US, there will only be one element in this array.

virKind :: Lens' VoterInfoResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "civicinfo#voterInfoResponse".

virDropOffLocations :: Lens' VoterInfoResponse [PollingLocation] Source #

Locations where a voter is eligible to drop off a completed ballot. The voter must have received and completed a ballot prior to arriving at the location. The location may not have ballots available on the premises. These locations could be open on or before election day as indicated in the pollingHours field.

virElection :: Lens' VoterInfoResponse (Maybe Election) Source #

The election that was queried.

virNormalizedInput :: Lens' VoterInfoResponse (Maybe SimpleAddressType) Source #

The normalized version of the requested address

virMailOnly :: Lens' VoterInfoResponse (Maybe Bool) Source #

Specifies whether voters in the precinct vote only by mailing their ballots (with the possible option of dropping off their ballots as well).

virEarlyVoteSites :: Lens' VoterInfoResponse [PollingLocation] Source #

Locations where the voter is eligible to vote early, prior to election day.

virPollingLocations :: Lens' VoterInfoResponse [PollingLocation] Source #

Locations where the voter is eligible to vote on election day.

PollingLocation

data PollingLocation Source #

A location where a voter can vote. This may be an early vote site, an election day voting location, or a drop off location for a completed ballot.

See: pollingLocation smart constructor.

Instances

Eq PollingLocation Source # 
Data PollingLocation Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PollingLocation -> c PollingLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PollingLocation #

toConstr :: PollingLocation -> Constr #

dataTypeOf :: PollingLocation -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c PollingLocation) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PollingLocation) #

gmapT :: (forall b. Data b => b -> b) -> PollingLocation -> PollingLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PollingLocation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PollingLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> PollingLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PollingLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PollingLocation -> m PollingLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PollingLocation -> m PollingLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PollingLocation -> m PollingLocation #

Show PollingLocation Source # 
Generic PollingLocation Source # 
ToJSON PollingLocation Source # 
FromJSON PollingLocation Source # 
type Rep PollingLocation Source # 

pollingLocation :: PollingLocation Source #

Creates a value of PollingLocation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

plVoterServices :: Lens' PollingLocation (Maybe Text) Source #

The services provided by this early vote site or drop off location. This field is not populated for polling locations.

plEndDate :: Lens' PollingLocation (Maybe Text) Source #

The last date that this early vote site or drop off location may be used. This field is not populated for polling locations.

plSources :: Lens' PollingLocation [Source] Source #

A list of sources for this location. If multiple sources are listed the data has been aggregated from those sources.

plAddress :: Lens' PollingLocation (Maybe SimpleAddressType) Source #

The address of the location.

plStartDate :: Lens' PollingLocation (Maybe Text) Source #

The first date that this early vote site or drop off location may be used. This field is not populated for polling locations.

plPollingHours :: Lens' PollingLocation (Maybe Text) Source #

A description of when this location is open.

plName :: Lens' PollingLocation (Maybe Text) Source #

The name of the early vote site or drop off location. This field is not populated for polling locations.

plId :: Lens' PollingLocation (Maybe Text) Source #

An ID for this object. IDs may change in future requests and should not be cached. Access to this field requires special access that can be requested from the Request more link on the Quotas page.

plNotes :: Lens' PollingLocation (Maybe Text) Source #

Notes about this location (e.g. accessibility ramp or entrance to use).

RepresentativesRepresentativeInfoByDivisionLevels

data RepresentativesRepresentativeInfoByDivisionLevels Source #

A list of office levels to filter by. Only offices that serve at least one of these levels will be returned. Divisions that don't contain a matching office will not be returned.

Constructors

ADMINISTRATIVEAREA1
administrativeArea1
ADMINISTRATIVEAREA2
administrativeArea2
Country
country
International
international
Locality
locality
Regional
regional
Special
special
SUBLOCALITY1
subLocality1
SUBLOCALITY2
subLocality2

Instances

Enum RepresentativesRepresentativeInfoByDivisionLevels Source # 
Eq RepresentativesRepresentativeInfoByDivisionLevels Source # 
Data RepresentativesRepresentativeInfoByDivisionLevels Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativesRepresentativeInfoByDivisionLevels -> c RepresentativesRepresentativeInfoByDivisionLevels #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativesRepresentativeInfoByDivisionLevels #

toConstr :: RepresentativesRepresentativeInfoByDivisionLevels -> Constr #

dataTypeOf :: RepresentativesRepresentativeInfoByDivisionLevels -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativesRepresentativeInfoByDivisionLevels) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativesRepresentativeInfoByDivisionLevels) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativesRepresentativeInfoByDivisionLevels -> RepresentativesRepresentativeInfoByDivisionLevels #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByDivisionLevels -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByDivisionLevels -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByDivisionLevels -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByDivisionLevels -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByDivisionLevels -> m RepresentativesRepresentativeInfoByDivisionLevels #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByDivisionLevels -> m RepresentativesRepresentativeInfoByDivisionLevels #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByDivisionLevels -> m RepresentativesRepresentativeInfoByDivisionLevels #

Ord RepresentativesRepresentativeInfoByDivisionLevels Source # 
Read RepresentativesRepresentativeInfoByDivisionLevels Source # 
Show RepresentativesRepresentativeInfoByDivisionLevels Source # 
Generic RepresentativesRepresentativeInfoByDivisionLevels Source # 
ToJSON RepresentativesRepresentativeInfoByDivisionLevels Source # 
FromJSON RepresentativesRepresentativeInfoByDivisionLevels Source # 
FromHttpApiData RepresentativesRepresentativeInfoByDivisionLevels Source # 
ToHttpApiData RepresentativesRepresentativeInfoByDivisionLevels Source # 
Hashable RepresentativesRepresentativeInfoByDivisionLevels Source # 
type Rep RepresentativesRepresentativeInfoByDivisionLevels Source # 
type Rep RepresentativesRepresentativeInfoByDivisionLevels = D1 (MetaData "RepresentativesRepresentativeInfoByDivisionLevels" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "ADMINISTRATIVEAREA1" PrefixI False) U1) (C1 (MetaCons "ADMINISTRATIVEAREA2" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Country" PrefixI False) U1) (C1 (MetaCons "International" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "Locality" PrefixI False) U1) (C1 (MetaCons "Regional" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Special" PrefixI False) U1) ((:+:) (C1 (MetaCons "SUBLOCALITY1" PrefixI False) U1) (C1 (MetaCons "SUBLOCALITY2" PrefixI False) U1)))))

GeographicDivision

data GeographicDivision Source #

Describes a political geography.

See: geographicDivision smart constructor.

Instances

Eq GeographicDivision Source # 
Data GeographicDivision Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GeographicDivision -> c GeographicDivision #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GeographicDivision #

toConstr :: GeographicDivision -> Constr #

dataTypeOf :: GeographicDivision -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c GeographicDivision) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GeographicDivision) #

gmapT :: (forall b. Data b => b -> b) -> GeographicDivision -> GeographicDivision #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GeographicDivision -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GeographicDivision -> r #

gmapQ :: (forall d. Data d => d -> u) -> GeographicDivision -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GeographicDivision -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GeographicDivision -> m GeographicDivision #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GeographicDivision -> m GeographicDivision #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GeographicDivision -> m GeographicDivision #

Show GeographicDivision Source # 
Generic GeographicDivision Source # 
ToJSON GeographicDivision Source # 
FromJSON GeographicDivision Source # 
type Rep GeographicDivision Source # 
type Rep GeographicDivision = D1 (MetaData "GeographicDivision" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "GeographicDivision'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_gdName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_gdOfficeIndices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Textual Word32]))) (S1 (MetaSel (Just Symbol "_gdAlsoKnownAs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))))

geographicDivision :: GeographicDivision Source #

Creates a value of GeographicDivision with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gdName :: Lens' GeographicDivision (Maybe Text) Source #

The name of the division.

gdOfficeIndices :: Lens' GeographicDivision [Word32] Source #

List of indices in the offices array, one for each office elected from this division. Will only be present if includeOffices was true (or absent) in the request.

gdAlsoKnownAs :: Lens' GeographicDivision [Text] Source #

Any other valid OCD IDs that refer to the same division. Because OCD IDs are meant to be human-readable and at least somewhat predictable, there are occasionally several identifiers for a single division. These identifiers are defined to be equivalent to one another, and one is always indicated as the primary identifier. The primary identifier will be returned in ocd_id above, and any other equivalent valid identifiers will be returned in this list. For example, if this division's OCD ID is ocd-division/country:us/district:dc, this will contain ocd-division/country:us/state:dc.

Candidate

data Candidate Source #

Information about a candidate running for elected office.

See: candidate smart constructor.

Instances

Eq Candidate Source # 
Data Candidate Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Candidate -> c Candidate #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Candidate #

toConstr :: Candidate -> Constr #

dataTypeOf :: Candidate -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Candidate) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Candidate) #

gmapT :: (forall b. Data b => b -> b) -> Candidate -> Candidate #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Candidate -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Candidate -> r #

gmapQ :: (forall d. Data d => d -> u) -> Candidate -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Candidate -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Candidate -> m Candidate #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Candidate -> m Candidate #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Candidate -> m Candidate #

Show Candidate Source # 
Generic Candidate Source # 

Associated Types

type Rep Candidate :: * -> * #

ToJSON Candidate Source # 
FromJSON Candidate Source # 
type Rep Candidate Source # 

candidate :: Candidate Source #

Creates a value of Candidate with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cEmail :: Lens' Candidate (Maybe Text) Source #

The email address for the candidate's campaign.

cPhone :: Lens' Candidate (Maybe Text) Source #

The voice phone number for the candidate's campaign office.

cPhotoURL :: Lens' Candidate (Maybe Text) Source #

A URL for a photo of the candidate.

cChannels :: Lens' Candidate [Channel] Source #

A list of known (social) media channels for this candidate.

cCandidateURL :: Lens' Candidate (Maybe Text) Source #

The URL for the candidate's campaign web site.

cOrderOnBallot :: Lens' Candidate (Maybe Int64) Source #

The order the candidate appears on the ballot for this contest.

cName :: Lens' Candidate (Maybe Text) Source #

The candidate's name.

cParty :: Lens' Candidate (Maybe Text) Source #

The full name of the party the candidate is a member of.

RepresentativesRepresentativeInfoByAddressLevels

data RepresentativesRepresentativeInfoByAddressLevels Source #

A list of office levels to filter by. Only offices that serve at least one of these levels will be returned. Divisions that don't contain a matching office will not be returned.

Constructors

RRIBALADMINISTRATIVEAREA1
administrativeArea1
RRIBALADMINISTRATIVEAREA2
administrativeArea2
RRIBALCountry
country
RRIBALInternational
international
RRIBALLocality
locality
RRIBALRegional
regional
RRIBALSpecial
special
RRIBALSUBLOCALITY1
subLocality1
RRIBALSUBLOCALITY2
subLocality2

Instances

Enum RepresentativesRepresentativeInfoByAddressLevels Source # 
Eq RepresentativesRepresentativeInfoByAddressLevels Source # 
Data RepresentativesRepresentativeInfoByAddressLevels Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativesRepresentativeInfoByAddressLevels -> c RepresentativesRepresentativeInfoByAddressLevels #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativesRepresentativeInfoByAddressLevels #

toConstr :: RepresentativesRepresentativeInfoByAddressLevels -> Constr #

dataTypeOf :: RepresentativesRepresentativeInfoByAddressLevels -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativesRepresentativeInfoByAddressLevels) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativesRepresentativeInfoByAddressLevels) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativesRepresentativeInfoByAddressLevels -> RepresentativesRepresentativeInfoByAddressLevels #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByAddressLevels -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByAddressLevels -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByAddressLevels -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByAddressLevels -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByAddressLevels -> m RepresentativesRepresentativeInfoByAddressLevels #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByAddressLevels -> m RepresentativesRepresentativeInfoByAddressLevels #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByAddressLevels -> m RepresentativesRepresentativeInfoByAddressLevels #

Ord RepresentativesRepresentativeInfoByAddressLevels Source # 
Read RepresentativesRepresentativeInfoByAddressLevels Source # 
Show RepresentativesRepresentativeInfoByAddressLevels Source # 
Generic RepresentativesRepresentativeInfoByAddressLevels Source # 
ToJSON RepresentativesRepresentativeInfoByAddressLevels Source # 
FromJSON RepresentativesRepresentativeInfoByAddressLevels Source # 
FromHttpApiData RepresentativesRepresentativeInfoByAddressLevels Source # 
ToHttpApiData RepresentativesRepresentativeInfoByAddressLevels Source # 
Hashable RepresentativesRepresentativeInfoByAddressLevels Source # 
type Rep RepresentativesRepresentativeInfoByAddressLevels Source # 
type Rep RepresentativesRepresentativeInfoByAddressLevels = D1 (MetaData "RepresentativesRepresentativeInfoByAddressLevels" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "RRIBALADMINISTRATIVEAREA1" PrefixI False) U1) (C1 (MetaCons "RRIBALADMINISTRATIVEAREA2" PrefixI False) U1)) ((:+:) (C1 (MetaCons "RRIBALCountry" PrefixI False) U1) (C1 (MetaCons "RRIBALInternational" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "RRIBALLocality" PrefixI False) U1) (C1 (MetaCons "RRIBALRegional" PrefixI False) U1)) ((:+:) (C1 (MetaCons "RRIBALSpecial" PrefixI False) U1) ((:+:) (C1 (MetaCons "RRIBALSUBLOCALITY1" PrefixI False) U1) (C1 (MetaCons "RRIBALSUBLOCALITY2" PrefixI False) U1)))))

Office

data Office Source #

Information about an Office held by one or more Officials.

See: office smart constructor.

Instances

Eq Office Source # 

Methods

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

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

Data Office Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Office -> c Office #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Office #

toConstr :: Office -> Constr #

dataTypeOf :: Office -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Office) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Office) #

gmapT :: (forall b. Data b => b -> b) -> Office -> Office #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Office -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Office -> r #

gmapQ :: (forall d. Data d => d -> u) -> Office -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Office -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Office -> m Office #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Office -> m Office #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Office -> m Office #

Show Office Source # 
Generic Office Source # 

Associated Types

type Rep Office :: * -> * #

Methods

from :: Office -> Rep Office x #

to :: Rep Office x -> Office #

ToJSON Office Source # 
FromJSON Office Source # 
type Rep Office Source # 

office :: Office Source #

Creates a value of Office with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oDivisionId :: Lens' Office (Maybe Text) Source #

The OCD ID of the division with which this office is associated.

oRoles :: Lens' Office [Text] Source #

The roles which this office fulfills. Roles are not meant to be exhaustive, or to exactly specify the entire set of responsibilities of a given office, but are meant to be rough categories that are useful for general selection from or sorting of a list of offices.

oOfficialIndices :: Lens' Office [Word32] Source #

List of indices in the officials array of people who presently hold this office.

oSources :: Lens' Office [Source] Source #

A list of sources for this office. If multiple sources are listed, the data has been aggregated from those sources.

oName :: Lens' Office (Maybe Text) Source #

The human-readable name of the office.

oLevels :: Lens' Office [Text] Source #

The levels of government of which this office is part. There may be more than one in cases where a jurisdiction effectively acts at two different levels of government; for example, the mayor of the District of Columbia acts at "locality" level, but also effectively at both "administrative-area-2" and "administrative-area-1".

RepresentativesRepresentativeInfoByDivisionRoles

data RepresentativesRepresentativeInfoByDivisionRoles Source #

A list of office roles to filter by. Only offices fulfilling one of these roles will be returned. Divisions that don't contain a matching office will not be returned.

Constructors

DeputyHeadOfGovernment
deputyHeadOfGovernment
ExecutiveCouncil
executiveCouncil
GovernmentOfficer
governmentOfficer
HeadOfGovernment
headOfGovernment
HeadOfState
headOfState
HighestCourtJudge
highestCourtJudge
Judge
judge
LegislatorLowerBody
legislatorLowerBody
LegislatorUpperBody
legislatorUpperBody
SchoolBoard
schoolBoard
SpecialPurposeOfficer
specialPurposeOfficer

Instances

Enum RepresentativesRepresentativeInfoByDivisionRoles Source # 
Eq RepresentativesRepresentativeInfoByDivisionRoles Source # 
Data RepresentativesRepresentativeInfoByDivisionRoles Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativesRepresentativeInfoByDivisionRoles -> c RepresentativesRepresentativeInfoByDivisionRoles #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativesRepresentativeInfoByDivisionRoles #

toConstr :: RepresentativesRepresentativeInfoByDivisionRoles -> Constr #

dataTypeOf :: RepresentativesRepresentativeInfoByDivisionRoles -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativesRepresentativeInfoByDivisionRoles) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativesRepresentativeInfoByDivisionRoles) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativesRepresentativeInfoByDivisionRoles -> RepresentativesRepresentativeInfoByDivisionRoles #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByDivisionRoles -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByDivisionRoles -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByDivisionRoles -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByDivisionRoles -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByDivisionRoles -> m RepresentativesRepresentativeInfoByDivisionRoles #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByDivisionRoles -> m RepresentativesRepresentativeInfoByDivisionRoles #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByDivisionRoles -> m RepresentativesRepresentativeInfoByDivisionRoles #

Ord RepresentativesRepresentativeInfoByDivisionRoles Source # 
Read RepresentativesRepresentativeInfoByDivisionRoles Source # 
Show RepresentativesRepresentativeInfoByDivisionRoles Source # 
Generic RepresentativesRepresentativeInfoByDivisionRoles Source # 
ToJSON RepresentativesRepresentativeInfoByDivisionRoles Source # 
FromJSON RepresentativesRepresentativeInfoByDivisionRoles Source # 
FromHttpApiData RepresentativesRepresentativeInfoByDivisionRoles Source # 
ToHttpApiData RepresentativesRepresentativeInfoByDivisionRoles Source # 
Hashable RepresentativesRepresentativeInfoByDivisionRoles Source # 
type Rep RepresentativesRepresentativeInfoByDivisionRoles Source # 
type Rep RepresentativesRepresentativeInfoByDivisionRoles = D1 (MetaData "RepresentativesRepresentativeInfoByDivisionRoles" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "DeputyHeadOfGovernment" PrefixI False) U1) (C1 (MetaCons "ExecutiveCouncil" PrefixI False) U1)) ((:+:) (C1 (MetaCons "GovernmentOfficer" PrefixI False) U1) ((:+:) (C1 (MetaCons "HeadOfGovernment" PrefixI False) U1) (C1 (MetaCons "HeadOfState" PrefixI False) U1)))) ((:+:) ((:+:) (C1 (MetaCons "HighestCourtJudge" PrefixI False) U1) ((:+:) (C1 (MetaCons "Judge" PrefixI False) U1) (C1 (MetaCons "LegislatorLowerBody" PrefixI False) U1))) ((:+:) (C1 (MetaCons "LegislatorUpperBody" PrefixI False) U1) ((:+:) (C1 (MetaCons "SchoolBoard" PrefixI False) U1) (C1 (MetaCons "SpecialPurposeOfficer" PrefixI False) U1)))))

Channel

data Channel Source #

A social media or web channel for a candidate.

See: channel smart constructor.

Instances

Eq Channel Source # 

Methods

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

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

Data Channel Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Channel -> c Channel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Channel #

toConstr :: Channel -> Constr #

dataTypeOf :: Channel -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Channel) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Channel) #

gmapT :: (forall b. Data b => b -> b) -> Channel -> Channel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Channel -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Channel -> r #

gmapQ :: (forall d. Data d => d -> u) -> Channel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Channel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Channel -> m Channel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Channel -> m Channel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Channel -> m Channel #

Show Channel Source # 
Generic Channel Source # 

Associated Types

type Rep Channel :: * -> * #

Methods

from :: Channel -> Rep Channel x #

to :: Rep Channel x -> Channel #

ToJSON Channel Source # 
FromJSON Channel Source # 
type Rep Channel Source # 
type Rep Channel = D1 (MetaData "Channel" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "Channel'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_cId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_cType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

channel :: Channel Source #

Creates a value of Channel with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cId :: Lens' Channel (Maybe Text) Source #

The unique public identifier for the candidate's channel.

cType :: Lens' Channel (Maybe Text) Source #

The type of channel. The following is a list of types of channels, but is not exhaustive. More channel types may be added at a later time. One of: GooglePlus, YouTube, Facebook, Twitter

Election

data Election Source #

Information about the election that was queried.

See: election smart constructor.

Instances

Eq Election Source # 
Data Election Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Election -> c Election #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Election #

toConstr :: Election -> Constr #

dataTypeOf :: Election -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Election) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Election) #

gmapT :: (forall b. Data b => b -> b) -> Election -> Election #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Election -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Election -> r #

gmapQ :: (forall d. Data d => d -> u) -> Election -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Election -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Election -> m Election #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Election -> m Election #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Election -> m Election #

Show Election Source # 
Generic Election Source # 

Associated Types

type Rep Election :: * -> * #

Methods

from :: Election -> Rep Election x #

to :: Rep Election x -> Election #

ToJSON Election Source # 
FromJSON Election Source # 
type Rep Election Source # 
type Rep Election = D1 (MetaData "Election" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "Election'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_eOcdDivisionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_eElectionDay") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_eName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_eId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))

election :: Election Source #

Creates a value of Election with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

eOcdDivisionId :: Lens' Election (Maybe Text) Source #

The political division of the election. Represented as an OCD Division ID. Voters within these political jurisdictions are covered by this election. This is typically a state such as ocd-division/country:us/state:ca or for the midterms or general election the entire US (i.e. ocd-division/country:us).

eElectionDay :: Lens' Election (Maybe Text) Source #

Day of the election in YYYY-MM-DD format.

eName :: Lens' Election (Maybe Text) Source #

A displayable name for the election.

eId :: Lens' Election (Maybe Int64) Source #

The unique ID of this election.

RepresentativeInfoResponse

data RepresentativeInfoResponse Source #

The result of a representative info lookup query.

See: representativeInfoResponse smart constructor.

Instances

Eq RepresentativeInfoResponse Source # 
Data RepresentativeInfoResponse Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativeInfoResponse -> c RepresentativeInfoResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativeInfoResponse #

toConstr :: RepresentativeInfoResponse -> Constr #

dataTypeOf :: RepresentativeInfoResponse -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativeInfoResponse) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativeInfoResponse) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativeInfoResponse -> RepresentativeInfoResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativeInfoResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativeInfoResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativeInfoResponse -> m RepresentativeInfoResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoResponse -> m RepresentativeInfoResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoResponse -> m RepresentativeInfoResponse #

Show RepresentativeInfoResponse Source # 
Generic RepresentativeInfoResponse Source # 
ToJSON RepresentativeInfoResponse Source # 
FromJSON RepresentativeInfoResponse Source # 
type Rep RepresentativeInfoResponse Source # 
type Rep RepresentativeInfoResponse = D1 (MetaData "RepresentativeInfoResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "RepresentativeInfoResponse'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_rirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_rirNormalizedInput") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType)))) ((:*:) (S1 (MetaSel (Just Symbol "_rirOfficials") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Official]))) ((:*:) (S1 (MetaSel (Just Symbol "_rirDivisions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepresentativeInfoResponseDivisions))) (S1 (MetaSel (Just Symbol "_rirOffices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Office])))))))

representativeInfoResponse :: RepresentativeInfoResponse Source #

Creates a value of RepresentativeInfoResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rirKind :: Lens' RepresentativeInfoResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "civicinfo#representativeInfoResponse".

rirNormalizedInput :: Lens' RepresentativeInfoResponse (Maybe SimpleAddressType) Source #

The normalized version of the requested address

rirOfficials :: Lens' RepresentativeInfoResponse [Official] Source #

Officials holding the offices listed above. Will only be present if includeOffices was true in the request.

rirDivisions :: Lens' RepresentativeInfoResponse (Maybe RepresentativeInfoResponseDivisions) Source #

Political geographic divisions that contain the requested address.

rirOffices :: Lens' RepresentativeInfoResponse [Office] Source #

Elected offices referenced by the divisions listed above. Will only be present if includeOffices was true in the request.

DivisionSearchResult

data DivisionSearchResult Source #

Represents a political geographic division that matches the requested query.

See: divisionSearchResult smart constructor.

Instances

Eq DivisionSearchResult Source # 
Data DivisionSearchResult Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DivisionSearchResult -> c DivisionSearchResult #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DivisionSearchResult #

toConstr :: DivisionSearchResult -> Constr #

dataTypeOf :: DivisionSearchResult -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c DivisionSearchResult) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DivisionSearchResult) #

gmapT :: (forall b. Data b => b -> b) -> DivisionSearchResult -> DivisionSearchResult #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DivisionSearchResult -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DivisionSearchResult -> r #

gmapQ :: (forall d. Data d => d -> u) -> DivisionSearchResult -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DivisionSearchResult -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DivisionSearchResult -> m DivisionSearchResult #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DivisionSearchResult -> m DivisionSearchResult #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DivisionSearchResult -> m DivisionSearchResult #

Show DivisionSearchResult Source # 
Generic DivisionSearchResult Source # 
ToJSON DivisionSearchResult Source # 
FromJSON DivisionSearchResult Source # 
type Rep DivisionSearchResult Source # 
type Rep DivisionSearchResult = D1 (MetaData "DivisionSearchResult" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "DivisionSearchResult'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_dsrAliases") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) ((:*:) (S1 (MetaSel (Just Symbol "_dsrName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_dsrOcdId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

divisionSearchResult :: DivisionSearchResult Source #

Creates a value of DivisionSearchResult with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dsrAliases :: Lens' DivisionSearchResult [Text] Source #

Other Open Civic Data identifiers that refer to the same division -- for example, those that refer to other political divisions whose boundaries are defined to be coterminous with this one. For example, ocd-division/country:us/state:wy will include an alias of ocd-division/country:us/state:wy/cd:1, since Wyoming has only one Congressional district.

dsrName :: Lens' DivisionSearchResult (Maybe Text) Source #

The name of the division.

dsrOcdId :: Lens' DivisionSearchResult (Maybe Text) Source #

The unique Open Civic Data identifier for this division.

AdministrativeBody

data AdministrativeBody Source #

Information about an election administrative body (e.g. County Board of Elections).

See: administrativeBody smart constructor.

Instances

Eq AdministrativeBody Source # 
Data AdministrativeBody Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdministrativeBody -> c AdministrativeBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdministrativeBody #

toConstr :: AdministrativeBody -> Constr #

dataTypeOf :: AdministrativeBody -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c AdministrativeBody) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdministrativeBody) #

gmapT :: (forall b. Data b => b -> b) -> AdministrativeBody -> AdministrativeBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdministrativeBody -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdministrativeBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdministrativeBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdministrativeBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdministrativeBody -> m AdministrativeBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdministrativeBody -> m AdministrativeBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdministrativeBody -> m AdministrativeBody #

Show AdministrativeBody Source # 
Generic AdministrativeBody Source # 
ToJSON AdministrativeBody Source # 
FromJSON AdministrativeBody Source # 
type Rep AdministrativeBody Source # 
type Rep AdministrativeBody = D1 (MetaData "AdministrativeBody" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "AdministrativeBody'" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_abCorrespondenceAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType))) ((:*:) (S1 (MetaSel (Just Symbol "_abAbsenteeVotingInfoURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_abHoursOfOperation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_abBallotInfoURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_abPhysicalAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType))) (S1 (MetaSel (Just Symbol "_abElectionRegistrationConfirmationURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_abElectionInfoURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_abVotingLocationFinderURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_abElectionOfficials") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ElectionOfficial]))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_abName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_abElectionRulesURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_abVoterServices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) (S1 (MetaSel (Just Symbol "_abElectionRegistrationURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

abCorrespondenceAddress :: Lens' AdministrativeBody (Maybe SimpleAddressType) Source #

The mailing address of this administrative body.

abAbsenteeVotingInfoURL :: Lens' AdministrativeBody (Maybe Text) Source #

A URL provided by this administrative body for information on absentee voting.

abHoursOfOperation :: Lens' AdministrativeBody (Maybe Text) Source #

A description of the hours of operation for this administrative body.

abBallotInfoURL :: Lens' AdministrativeBody (Maybe Text) Source #

A URL provided by this administrative body to give contest information to the voter.

abPhysicalAddress :: Lens' AdministrativeBody (Maybe SimpleAddressType) Source #

The physical address of this administrative body.

abElectionRegistrationConfirmationURL :: Lens' AdministrativeBody (Maybe Text) Source #

A URL provided by this administrative body for confirming that the voter is registered to vote.

abElectionInfoURL :: Lens' AdministrativeBody (Maybe Text) Source #

A URL provided by this administrative body for looking up general election information.

abVotingLocationFinderURL :: Lens' AdministrativeBody (Maybe Text) Source #

A URL provided by this administrative body for looking up where to vote.

abElectionOfficials :: Lens' AdministrativeBody [ElectionOfficial] Source #

The election officials for this election administrative body.

abName :: Lens' AdministrativeBody (Maybe Text) Source #

The name of this election administrative body.

abElectionRulesURL :: Lens' AdministrativeBody (Maybe Text) Source #

A URL provided by this administrative body describing election rules to the voter.

abVoterServices :: Lens' AdministrativeBody [Text] Source #

A description of the services this administrative body may provide.

abElectionRegistrationURL :: Lens' AdministrativeBody (Maybe Text) Source #

A URL provided by this administrative body for looking up how to register to vote.

Contest

data Contest Source #

Information about a contest that appears on a voter's ballot.

See: contest smart constructor.

Instances

Eq Contest Source # 

Methods

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

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

Data Contest Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Contest -> c Contest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Contest #

toConstr :: Contest -> Constr #

dataTypeOf :: Contest -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Contest) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Contest) #

gmapT :: (forall b. Data b => b -> b) -> Contest -> Contest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Contest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Contest -> r #

gmapQ :: (forall d. Data d => d -> u) -> Contest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Contest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Contest -> m Contest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Contest -> m Contest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Contest -> m Contest #

Show Contest Source # 
Generic Contest Source # 

Associated Types

type Rep Contest :: * -> * #

Methods

from :: Contest -> Rep Contest x #

to :: Rep Contest x -> Contest #

ToJSON Contest Source # 
FromJSON Contest Source # 
type Rep Contest Source # 
type Rep Contest = D1 (MetaData "Contest" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "Contest'" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumPassageThreshold") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_conRoles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) (S1 (MetaSel (Just Symbol "_conReferendumURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumEffectOfAbstain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumSubtitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_conNumberVotingFor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_conOffice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumConStatement") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_conSources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Source]))))) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumProStatement") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumBallotResponses") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) (S1 (MetaSel (Just Symbol "_conNumberElected") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_conSpecial") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_conPrimaryParty") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_conId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_conType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_conElectorateSpecifications") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumBrief") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_conDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ElectoralDistrict))) (S1 (MetaSel (Just Symbol "_conLevel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))) ((:*:) (S1 (MetaSel (Just Symbol "_conCandidates") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Candidate]))) ((:*:) (S1 (MetaSel (Just Symbol "_conReferendumTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_conBallotPlacement") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))))))

conReferendumPassageThreshold :: Lens' Contest (Maybe Text) Source #

The threshold of votes that the referendum needs in order to pass, e.g. "two-thirds". This field is only populated for contests of type 'Referendum'.

conRoles :: Lens' Contest [Text] Source #

The roles which this office fulfills.

conReferendumURL :: Lens' Contest (Maybe Text) Source #

A link to the referendum. This field is only populated for contests of type 'Referendum'.

conReferendumEffectOfAbstain :: Lens' Contest (Maybe Text) Source #

Specifies what effect abstaining (not voting) on the proposition will have (i.e. whether abstaining is considered a vote against it). This field is only populated for contests of type 'Referendum'.

conReferendumSubtitle :: Lens' Contest (Maybe Text) Source #

A brief description of the referendum. This field is only populated for contests of type 'Referendum'.

conNumberVotingFor :: Lens' Contest (Maybe Int64) Source #

The number of candidates that a voter may vote for in this contest.

conOffice :: Lens' Contest (Maybe Text) Source #

The name of the office for this contest.

conReferendumConStatement :: Lens' Contest (Maybe Text) Source #

A statement in opposition to the referendum. It does not necessarily appear on the ballot. This field is only populated for contests of type 'Referendum'.

conSources :: Lens' Contest [Source] Source #

A list of sources for this contest. If multiple sources are listed, the data has been aggregated from those sources.

conReferendumProStatement :: Lens' Contest (Maybe Text) Source #

A statement in favor of the referendum. It does not necessarily appear on the ballot. This field is only populated for contests of type 'Referendum'.

conReferendumBallotResponses :: Lens' Contest [Text] Source #

The set of ballot responses for the referendum. A ballot response represents a line on the ballot. Common examples might include "yes" or "no" for referenda, or a judge's name for a retention contest. This field is only populated for contests of type 'Referendum'.

conNumberElected :: Lens' Contest (Maybe Int64) Source #

The number of candidates that will be elected to office in this contest.

conSpecial :: Lens' Contest (Maybe Text) Source #

"Yes" or "No" depending on whether this a contest being held outside the normal election cycle.

conReferendumText :: Lens' Contest (Maybe Text) Source #

The full text of the referendum. This field is only populated for contests of type 'Referendum'.

conPrimaryParty :: Lens' Contest (Maybe Text) Source #

If this is a partisan election, the name of the party it is for.

conId :: Lens' Contest (Maybe Text) Source #

An ID for this object. IDs may change in future requests and should not be cached. Access to this field requires special access that can be requested from the Request more link on the Quotas page.

conType :: Lens' Contest (Maybe Text) Source #

The type of contest. Usually this will be 'General', 'Primary', or 'Run-off' for contests with candidates. For referenda this will be 'Referendum'.

conElectorateSpecifications :: Lens' Contest (Maybe Text) Source #

A description of any additional eligibility requirements for voting in this contest.

conReferendumBrief :: Lens' Contest (Maybe Text) Source #

Specifies a short summary of the referendum that is typically on the ballot below the title but above the text. This field is only populated for contests of type 'Referendum'.

conDistrict :: Lens' Contest (Maybe ElectoralDistrict) Source #

Information about the electoral district that this contest is in.

conLevel :: Lens' Contest [Text] Source #

The levels of government of the office for this contest. There may be more than one in cases where a jurisdiction effectively acts at two different levels of government; for example, the mayor of the District of Columbia acts at "locality" level, but also effectively at both "administrative-area-2" and "administrative-area-1".

conCandidates :: Lens' Contest [Candidate] Source #

The candidate choices for this contest.

conReferendumTitle :: Lens' Contest (Maybe Text) Source #

The title of the referendum (e.g. 'Proposition 42'). This field is only populated for contests of type 'Referendum'.

conBallotPlacement :: Lens' Contest (Maybe Int64) Source #

A number specifying the position of this contest on the voter's ballot.

DivisionSearchResponse

data DivisionSearchResponse Source #

The result of a division search query.

See: divisionSearchResponse smart constructor.

Instances

Eq DivisionSearchResponse Source # 
Data DivisionSearchResponse Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DivisionSearchResponse -> c DivisionSearchResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DivisionSearchResponse #

toConstr :: DivisionSearchResponse -> Constr #

dataTypeOf :: DivisionSearchResponse -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c DivisionSearchResponse) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DivisionSearchResponse) #

gmapT :: (forall b. Data b => b -> b) -> DivisionSearchResponse -> DivisionSearchResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DivisionSearchResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DivisionSearchResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DivisionSearchResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DivisionSearchResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DivisionSearchResponse -> m DivisionSearchResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DivisionSearchResponse -> m DivisionSearchResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DivisionSearchResponse -> m DivisionSearchResponse #

Show DivisionSearchResponse Source # 
Generic DivisionSearchResponse Source # 
ToJSON DivisionSearchResponse Source # 
FromJSON DivisionSearchResponse Source # 
type Rep DivisionSearchResponse Source # 
type Rep DivisionSearchResponse = D1 (MetaData "DivisionSearchResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "DivisionSearchResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_dsrResults") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DivisionSearchResult]))) (S1 (MetaSel (Just Symbol "_dsrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

divisionSearchResponse :: DivisionSearchResponse Source #

Creates a value of DivisionSearchResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dsrKind :: Lens' DivisionSearchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "civicinfo#divisionSearchResponse".

RepresentativeInfoDataDivisions

data RepresentativeInfoDataDivisions Source #

Political geographic divisions that contain the requested address.

See: representativeInfoDataDivisions smart constructor.

Instances

Eq RepresentativeInfoDataDivisions Source # 
Data RepresentativeInfoDataDivisions Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativeInfoDataDivisions -> c RepresentativeInfoDataDivisions #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativeInfoDataDivisions #

toConstr :: RepresentativeInfoDataDivisions -> Constr #

dataTypeOf :: RepresentativeInfoDataDivisions -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativeInfoDataDivisions) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativeInfoDataDivisions) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativeInfoDataDivisions -> RepresentativeInfoDataDivisions #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoDataDivisions -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoDataDivisions -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativeInfoDataDivisions -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativeInfoDataDivisions -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativeInfoDataDivisions -> m RepresentativeInfoDataDivisions #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoDataDivisions -> m RepresentativeInfoDataDivisions #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoDataDivisions -> m RepresentativeInfoDataDivisions #

Show RepresentativeInfoDataDivisions Source # 
Generic RepresentativeInfoDataDivisions Source # 
ToJSON RepresentativeInfoDataDivisions Source # 
FromJSON RepresentativeInfoDataDivisions Source # 
type Rep RepresentativeInfoDataDivisions Source # 
type Rep RepresentativeInfoDataDivisions = D1 (MetaData "RepresentativeInfoDataDivisions" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" True) (C1 (MetaCons "RepresentativeInfoDataDivisions'" PrefixI True) (S1 (MetaSel (Just Symbol "_riddAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text GeographicDivision))))

representativeInfoDataDivisions Source #

Creates a value of RepresentativeInfoDataDivisions with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

riddAddtional :: Lens' RepresentativeInfoDataDivisions (HashMap Text GeographicDivision) Source #

The unique Open Civic Data identifier for this division.

RepresentativesRepresentativeInfoByAddressRoles

data RepresentativesRepresentativeInfoByAddressRoles Source #

A list of office roles to filter by. Only offices fulfilling one of these roles will be returned. Divisions that don't contain a matching office will not be returned.

Constructors

RRIBARDeputyHeadOfGovernment
deputyHeadOfGovernment
RRIBARExecutiveCouncil
executiveCouncil
RRIBARGovernmentOfficer
governmentOfficer
RRIBARHeadOfGovernment
headOfGovernment
RRIBARHeadOfState
headOfState
RRIBARHighestCourtJudge
highestCourtJudge
RRIBARJudge
judge
RRIBARLegislatorLowerBody
legislatorLowerBody
RRIBARLegislatorUpperBody
legislatorUpperBody
RRIBARSchoolBoard
schoolBoard
RRIBARSpecialPurposeOfficer
specialPurposeOfficer

Instances

Enum RepresentativesRepresentativeInfoByAddressRoles Source # 
Eq RepresentativesRepresentativeInfoByAddressRoles Source # 
Data RepresentativesRepresentativeInfoByAddressRoles Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativesRepresentativeInfoByAddressRoles -> c RepresentativesRepresentativeInfoByAddressRoles #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativesRepresentativeInfoByAddressRoles #

toConstr :: RepresentativesRepresentativeInfoByAddressRoles -> Constr #

dataTypeOf :: RepresentativesRepresentativeInfoByAddressRoles -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativesRepresentativeInfoByAddressRoles) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativesRepresentativeInfoByAddressRoles) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativesRepresentativeInfoByAddressRoles -> RepresentativesRepresentativeInfoByAddressRoles #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByAddressRoles -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativesRepresentativeInfoByAddressRoles -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByAddressRoles -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativesRepresentativeInfoByAddressRoles -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByAddressRoles -> m RepresentativesRepresentativeInfoByAddressRoles #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByAddressRoles -> m RepresentativesRepresentativeInfoByAddressRoles #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativesRepresentativeInfoByAddressRoles -> m RepresentativesRepresentativeInfoByAddressRoles #

Ord RepresentativesRepresentativeInfoByAddressRoles Source # 
Read RepresentativesRepresentativeInfoByAddressRoles Source # 
Show RepresentativesRepresentativeInfoByAddressRoles Source # 
Generic RepresentativesRepresentativeInfoByAddressRoles Source # 
ToJSON RepresentativesRepresentativeInfoByAddressRoles Source # 
FromJSON RepresentativesRepresentativeInfoByAddressRoles Source # 
FromHttpApiData RepresentativesRepresentativeInfoByAddressRoles Source # 
ToHttpApiData RepresentativesRepresentativeInfoByAddressRoles Source # 
Hashable RepresentativesRepresentativeInfoByAddressRoles Source # 
type Rep RepresentativesRepresentativeInfoByAddressRoles Source # 
type Rep RepresentativesRepresentativeInfoByAddressRoles = D1 (MetaData "RepresentativesRepresentativeInfoByAddressRoles" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "RRIBARDeputyHeadOfGovernment" PrefixI False) U1) (C1 (MetaCons "RRIBARExecutiveCouncil" PrefixI False) U1)) ((:+:) (C1 (MetaCons "RRIBARGovernmentOfficer" PrefixI False) U1) ((:+:) (C1 (MetaCons "RRIBARHeadOfGovernment" PrefixI False) U1) (C1 (MetaCons "RRIBARHeadOfState" PrefixI False) U1)))) ((:+:) ((:+:) (C1 (MetaCons "RRIBARHighestCourtJudge" PrefixI False) U1) ((:+:) (C1 (MetaCons "RRIBARJudge" PrefixI False) U1) (C1 (MetaCons "RRIBARLegislatorLowerBody" PrefixI False) U1))) ((:+:) (C1 (MetaCons "RRIBARLegislatorUpperBody" PrefixI False) U1) ((:+:) (C1 (MetaCons "RRIBARSchoolBoard" PrefixI False) U1) (C1 (MetaCons "RRIBARSpecialPurposeOfficer" PrefixI False) U1)))))

ElectionOfficial

data ElectionOfficial Source #

Information about individual election officials.

See: electionOfficial smart constructor.

Instances

Eq ElectionOfficial Source # 
Data ElectionOfficial Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ElectionOfficial -> c ElectionOfficial #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ElectionOfficial #

toConstr :: ElectionOfficial -> Constr #

dataTypeOf :: ElectionOfficial -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c ElectionOfficial) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ElectionOfficial) #

gmapT :: (forall b. Data b => b -> b) -> ElectionOfficial -> ElectionOfficial #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ElectionOfficial -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ElectionOfficial -> r #

gmapQ :: (forall d. Data d => d -> u) -> ElectionOfficial -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ElectionOfficial -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ElectionOfficial -> m ElectionOfficial #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ElectionOfficial -> m ElectionOfficial #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ElectionOfficial -> m ElectionOfficial #

Show ElectionOfficial Source # 
Generic ElectionOfficial Source # 
ToJSON ElectionOfficial Source # 
FromJSON ElectionOfficial Source # 
type Rep ElectionOfficial Source # 
type Rep ElectionOfficial = D1 (MetaData "ElectionOfficial" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "ElectionOfficial'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_eoFaxNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_eoName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_eoOfficePhoneNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_eoEmailAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_eoTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

electionOfficial :: ElectionOfficial Source #

Creates a value of ElectionOfficial with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

eoFaxNumber :: Lens' ElectionOfficial (Maybe Text) Source #

The fax number of the election official.

eoName :: Lens' ElectionOfficial (Maybe Text) Source #

The full name of the election official.

eoOfficePhoneNumber :: Lens' ElectionOfficial (Maybe Text) Source #

The office phone number of the election official.

eoEmailAddress :: Lens' ElectionOfficial (Maybe Text) Source #

The email address of the election official.

eoTitle :: Lens' ElectionOfficial (Maybe Text) Source #

The title of the election official.

RepresentativeInfoData

data RepresentativeInfoData Source #

Instances

Eq RepresentativeInfoData Source # 
Data RepresentativeInfoData Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepresentativeInfoData -> c RepresentativeInfoData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepresentativeInfoData #

toConstr :: RepresentativeInfoData -> Constr #

dataTypeOf :: RepresentativeInfoData -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RepresentativeInfoData) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepresentativeInfoData) #

gmapT :: (forall b. Data b => b -> b) -> RepresentativeInfoData -> RepresentativeInfoData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoData -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepresentativeInfoData -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepresentativeInfoData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepresentativeInfoData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepresentativeInfoData -> m RepresentativeInfoData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoData -> m RepresentativeInfoData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepresentativeInfoData -> m RepresentativeInfoData #

Show RepresentativeInfoData Source # 
Generic RepresentativeInfoData Source # 
ToJSON RepresentativeInfoData Source # 
FromJSON RepresentativeInfoData Source # 
type Rep RepresentativeInfoData Source # 
type Rep RepresentativeInfoData = D1 (MetaData "RepresentativeInfoData" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "RepresentativeInfoData'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_ridOfficials") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Official]))) ((:*:) (S1 (MetaSel (Just Symbol "_ridDivisions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepresentativeInfoDataDivisions))) (S1 (MetaSel (Just Symbol "_ridOffices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Office]))))))

representativeInfoData :: RepresentativeInfoData Source #

Creates a value of RepresentativeInfoData with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ridOfficials :: Lens' RepresentativeInfoData [Official] Source #

Officials holding the offices listed above. Will only be present if includeOffices was true in the request.

ridDivisions :: Lens' RepresentativeInfoData (Maybe RepresentativeInfoDataDivisions) Source #

Political geographic divisions that contain the requested address.

ridOffices :: Lens' RepresentativeInfoData [Office] Source #

Elected offices referenced by the divisions listed above. Will only be present if includeOffices was true in the request.

Source

data Source Source #

Contains information about the data source for the element containing it.

See: source smart constructor.

Instances

Eq Source Source # 

Methods

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

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

Data Source Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Source -> c Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Source #

toConstr :: Source -> Constr #

dataTypeOf :: Source -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Source) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Source) #

gmapT :: (forall b. Data b => b -> b) -> Source -> Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Source -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Source -> r #

gmapQ :: (forall d. Data d => d -> u) -> Source -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Source -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Source -> m Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Source -> m Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Source -> m Source #

Show Source Source # 
Generic Source Source # 

Associated Types

type Rep Source :: * -> * #

Methods

from :: Source -> Rep Source x #

to :: Rep Source x -> Source #

ToJSON Source Source # 
FromJSON Source Source # 
type Rep Source Source # 
type Rep Source = D1 (MetaData "Source" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "Source'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_sOfficial") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

source :: Source Source #

Creates a value of Source with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sName :: Lens' Source (Maybe Text) Source #

The name of the data source.

sOfficial :: Lens' Source (Maybe Bool) Source #

Whether this data comes from an official government source.

ElectoralDistrict

data ElectoralDistrict Source #

Describes the geographic scope of a contest.

See: electoralDistrict smart constructor.

Instances

Eq ElectoralDistrict Source # 
Data ElectoralDistrict Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ElectoralDistrict -> c ElectoralDistrict #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ElectoralDistrict #

toConstr :: ElectoralDistrict -> Constr #

dataTypeOf :: ElectoralDistrict -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c ElectoralDistrict) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ElectoralDistrict) #

gmapT :: (forall b. Data b => b -> b) -> ElectoralDistrict -> ElectoralDistrict #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ElectoralDistrict -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ElectoralDistrict -> r #

gmapQ :: (forall d. Data d => d -> u) -> ElectoralDistrict -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ElectoralDistrict -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ElectoralDistrict -> m ElectoralDistrict #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ElectoralDistrict -> m ElectoralDistrict #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ElectoralDistrict -> m ElectoralDistrict #

Show ElectoralDistrict Source # 
Generic ElectoralDistrict Source # 
ToJSON ElectoralDistrict Source # 
FromJSON ElectoralDistrict Source # 
type Rep ElectoralDistrict Source # 
type Rep ElectoralDistrict = D1 (MetaData "ElectoralDistrict" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "ElectoralDistrict'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_edName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_edScope") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_edId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

electoralDistrict :: ElectoralDistrict Source #

Creates a value of ElectoralDistrict with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

edName :: Lens' ElectoralDistrict (Maybe Text) Source #

The name of the district.

edScope :: Lens' ElectoralDistrict (Maybe Text) Source #

The geographic scope of this district. If unspecified the district's geography is not known. One of: national, statewide, congressional, stateUpper, stateLower, countywide, judicial, schoolBoard, cityWide, township, countyCouncil, cityCouncil, ward, special

edId :: Lens' ElectoralDistrict (Maybe Text) Source #

An identifier for this district, relative to its scope. For example, the 34th State Senate district would have id "34" and a scope of stateUpper.

SimpleAddressType

data SimpleAddressType Source #

A simple representation of an address.

See: simpleAddressType smart constructor.

Instances

Eq SimpleAddressType Source # 
Data SimpleAddressType Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SimpleAddressType -> c SimpleAddressType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SimpleAddressType #

toConstr :: SimpleAddressType -> Constr #

dataTypeOf :: SimpleAddressType -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c SimpleAddressType) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SimpleAddressType) #

gmapT :: (forall b. Data b => b -> b) -> SimpleAddressType -> SimpleAddressType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SimpleAddressType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SimpleAddressType -> r #

gmapQ :: (forall d. Data d => d -> u) -> SimpleAddressType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SimpleAddressType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SimpleAddressType -> m SimpleAddressType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SimpleAddressType -> m SimpleAddressType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SimpleAddressType -> m SimpleAddressType #

Show SimpleAddressType Source # 
Generic SimpleAddressType Source # 
ToJSON SimpleAddressType Source # 
FromJSON SimpleAddressType Source # 
type Rep SimpleAddressType Source # 

simpleAddressType :: SimpleAddressType Source #

Creates a value of SimpleAddressType with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

satLine2 :: Lens' SimpleAddressType (Maybe Text) Source #

The second line the address, if needed.

satState :: Lens' SimpleAddressType (Maybe Text) Source #

The US two letter state abbreviation of the address.

satLine3 :: Lens' SimpleAddressType (Maybe Text) Source #

The third line of the address, if needed.

satZip :: Lens' SimpleAddressType (Maybe Text) Source #

The US Postal Zip Code of the address.

satCity :: Lens' SimpleAddressType (Maybe Text) Source #

The city or town for the address.

satLine1 :: Lens' SimpleAddressType (Maybe Text) Source #

The street name and number of this address.

satLocationName :: Lens' SimpleAddressType (Maybe Text) Source #

The name of the location.

AdministrationRegion

data AdministrationRegion Source #

Describes information about a regional election administrative area.

See: administrationRegion smart constructor.

Instances

Eq AdministrationRegion Source # 
Data AdministrationRegion Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdministrationRegion -> c AdministrationRegion #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdministrationRegion #

toConstr :: AdministrationRegion -> Constr #

dataTypeOf :: AdministrationRegion -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c AdministrationRegion) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdministrationRegion) #

gmapT :: (forall b. Data b => b -> b) -> AdministrationRegion -> AdministrationRegion #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdministrationRegion -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdministrationRegion -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdministrationRegion -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdministrationRegion -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdministrationRegion -> m AdministrationRegion #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdministrationRegion -> m AdministrationRegion #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdministrationRegion -> m AdministrationRegion #

Show AdministrationRegion Source # 
Generic AdministrationRegion Source # 
ToJSON AdministrationRegion Source # 
FromJSON AdministrationRegion Source # 
type Rep AdministrationRegion Source # 
type Rep AdministrationRegion = D1 (MetaData "AdministrationRegion" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "AdministrationRegion'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_arLocalJurisdiction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AdministrationRegion))) (S1 (MetaSel (Just Symbol "_arSources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Source])))) ((:*:) (S1 (MetaSel (Just Symbol "_arName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_arElectionAdministrationBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AdministrativeBody))) (S1 (MetaSel (Just Symbol "_arId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

administrationRegion :: AdministrationRegion Source #

Creates a value of AdministrationRegion with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

arLocalJurisdiction :: Lens' AdministrationRegion (Maybe AdministrationRegion) Source #

The city or county that provides election information for this voter. This object can have the same elements as state.

arSources :: Lens' AdministrationRegion [Source] Source #

A list of sources for this area. If multiple sources are listed the data has been aggregated from those sources.

arName :: Lens' AdministrationRegion (Maybe Text) Source #

The name of the jurisdiction.

arElectionAdministrationBody :: Lens' AdministrationRegion (Maybe AdministrativeBody) Source #

The election administration body for this area.

arId :: Lens' AdministrationRegion (Maybe Text) Source #

An ID for this object. IDs may change in future requests and should not be cached. Access to this field requires special access that can be requested from the Request more link on the Quotas page.

ElectionsQueryResponse

data ElectionsQueryResponse Source #

The list of elections available for this version of the API.

See: electionsQueryResponse smart constructor.

Instances

Eq ElectionsQueryResponse Source # 
Data ElectionsQueryResponse Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ElectionsQueryResponse -> c ElectionsQueryResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ElectionsQueryResponse #

toConstr :: ElectionsQueryResponse -> Constr #

dataTypeOf :: ElectionsQueryResponse -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c ElectionsQueryResponse) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ElectionsQueryResponse) #

gmapT :: (forall b. Data b => b -> b) -> ElectionsQueryResponse -> ElectionsQueryResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ElectionsQueryResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ElectionsQueryResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ElectionsQueryResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ElectionsQueryResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ElectionsQueryResponse -> m ElectionsQueryResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ElectionsQueryResponse -> m ElectionsQueryResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ElectionsQueryResponse -> m ElectionsQueryResponse #

Show ElectionsQueryResponse Source # 
Generic ElectionsQueryResponse Source # 
ToJSON ElectionsQueryResponse Source # 
FromJSON ElectionsQueryResponse Source # 
type Rep ElectionsQueryResponse Source # 
type Rep ElectionsQueryResponse = D1 (MetaData "ElectionsQueryResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.1.0-BMTHapOmvs94zoyvbGGxCN" False) (C1 (MetaCons "ElectionsQueryResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_eqrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_eqrElections") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Election])))))

electionsQueryResponse :: ElectionsQueryResponse Source #

Creates a value of ElectionsQueryResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

eqrKind :: Lens' ElectionsQueryResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "civicinfo#electionsQueryResponse".

eqrElections :: Lens' ElectionsQueryResponse [Election] Source #

A list of available elections

Official

data Official Source #

Information about a person holding an elected office.

See: official smart constructor.

Instances

Eq Official Source # 
Data Official Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Official -> c Official #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Official #

toConstr :: Official -> Constr #

dataTypeOf :: Official -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Official) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Official) #

gmapT :: (forall b. Data b => b -> b) -> Official -> Official #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Official -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Official -> r #

gmapQ :: (forall d. Data d => d -> u) -> Official -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Official -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Official -> m Official #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Official -> m Official #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Official -> m Official #

Show Official Source # 
Generic Official Source # 

Associated Types

type Rep Official :: * -> * #

Methods

from :: Official -> Rep Official x #

to :: Rep Official x -> Official #

ToJSON Official Source # 
FromJSON Official Source # 
type Rep Official Source # 

official :: Official Source #

Creates a value of Official with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

offPhotoURL :: Lens' Official (Maybe Text) Source #

A URL for a photo of the official.

offURLs :: Lens' Official [Text] Source #

The official's public website URLs.

offChannels :: Lens' Official [Channel] Source #

A list of known (social) media channels for this official.

offAddress :: Lens' Official [SimpleAddressType] Source #

Addresses at which to contact the official.

offPhones :: Lens' Official [Text] Source #

The official's public contact phone numbers.

offName :: Lens' Official (Maybe Text) Source #

The official's name.

offEmails :: Lens' Official [Text] Source #

The direct email addresses for the official.

offParty :: Lens' Official (Maybe Text) Source #

The full name of the party the official belongs to.