gogol-civicinfo-0.5.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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data RepresentativeInfoResponseDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic RepresentativeInfoResponseDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

ToJSON RepresentativeInfoResponseDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON RepresentativeInfoResponseDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoResponseDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoResponseDivisions = D1 (MetaData "RepresentativeInfoResponseDivisions" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "RepresentativeInfoResponseDivisions'" PrefixI True) (S1 (MetaSel (Just "_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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data VoterInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic VoterInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep VoterInfoResponse :: Type -> Type #

ToJSON VoterInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON VoterInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep VoterInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep VoterInfoResponse = D1 (MetaData "VoterInfoResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "VoterInfoResponse'" PrefixI True) (((S1 (MetaSel (Just "_virOtherElections") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Election])) :*: (S1 (MetaSel (Just "_virContests") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Contest])) :*: S1 (MetaSel (Just "_virState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AdministrationRegion])))) :*: (S1 (MetaSel (Just "_virKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_virDropOffLocations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PollingLocation])) :*: S1 (MetaSel (Just "_virElection") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Election))))) :*: ((S1 (MetaSel (Just "_virNormalizedInput") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType)) :*: (S1 (MetaSel (Just "_virMailOnly") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_virSegments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StreetSegment])))) :*: (S1 (MetaSel (Just "_virEarlyVoteSites") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PollingLocation])) :*: (S1 (MetaSel (Just "_virPollingLocations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PollingLocation])) :*: S1 (MetaSel (Just "_virPrecinctId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

virOtherElections :: Lens' VoterInfoResponse [Election] Source #

When there are multiple elections for a voter address, the otherElections field is populated in the API response and there are two possibilities: 1. If the earliest election is not the intended election, specify the election ID of the desired election in a second API request using the electionId field. 2. If these elections occur on the same day, the API doesn?t return any polling location, contest, or election official information to ensure that an additional query is made. For user-facing applications, we recommend displaying these elections to the user to disambiguate. A second API request using the electionId field should be made for the election that is relevant to the user.

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data PollingLocation Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic PollingLocation Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep PollingLocation :: Type -> Type #

ToJSON PollingLocation Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON PollingLocation Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep PollingLocation Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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.

plLatitude :: Lens' PollingLocation (Maybe Double) Source #

Latitude of the location, in degrees north of the equator. Only some locations -- generally, ballot drop boxes for vote-by-mail elections -- will have this set; for others, use a geocoding service like the Google Maps API to resolve the address to a geographic point.

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).

plLongitude :: Lens' PollingLocation (Maybe Double) Source #

Longitude of the location, in degrees east of the Prime Meridian. Only some locations -- generally, ballot drop boxes for vote-by-mail elections -- will have this set; for others, use a geocoding service like the Google Maps API to resolve the address to a geographic point.

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Eq RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Data RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Read RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Show RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Generic RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Hashable RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToJSON RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromJSON RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromHttpApiData RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToHttpApiData RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByDivisionLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByDivisionLevels = D1 (MetaData "RepresentativesRepresentativeInfoByDivisionLevels" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (((C1 (MetaCons "ADMINISTRATIVEAREA1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ADMINISTRATIVEAREA2" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Country" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "International" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Locality" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Regional" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Special" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SUBLOCALITY1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SUBLOCALITY2" PrefixI False) (U1 :: Type -> Type)))))

GeographicDivision

data GeographicDivision Source #

Describes a political geography.

See: geographicDivision smart constructor.

Instances
Eq GeographicDivision Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data GeographicDivision Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic GeographicDivision Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep GeographicDivision :: Type -> Type #

ToJSON GeographicDivision Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON GeographicDivision Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep GeographicDivision Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep GeographicDivision = D1 (MetaData "GeographicDivision" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "GeographicDivision'" PrefixI True) (S1 (MetaSel (Just "_gdName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdOfficeIndices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Textual Word32])) :*: S1 (MetaSel (Just "_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.

StreetSegment

data StreetSegment Source #

Instances
Eq StreetSegment Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data StreetSegment Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: StreetSegment -> Constr #

dataTypeOf :: StreetSegment -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StreetSegment Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic StreetSegment Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep StreetSegment :: Type -> Type #

ToJSON StreetSegment Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON StreetSegment Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep StreetSegment Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep StreetSegment = D1 (MetaData "StreetSegment" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "StreetSegment'" PrefixI True) (((((S1 (MetaSel (Just "_ssOriginalId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssPollinglocationByIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_ssStartHouseNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_ssCataListUniquePrecinctCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_ssContestIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_ssStateHouseDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssNcoaAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ssEarlyVoteSiteByIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_ssCountyCouncilDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssCityCouncilDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) :*: (((S1 (MetaSel (Just "_ssGeocodedPoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PointProto)) :*: S1 (MetaSel (Just "_ssEndHouseNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_ssSubAdministrativeAreaName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ssPublished") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_ssStartLatE7") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) :*: ((S1 (MetaSel (Just "_ssZip") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ssSurrogateId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_ssMunicipalDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ssWardDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ssVoterGeographicDivisionOcdIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_ssStreetName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))) :*: ((((S1 (MetaSel (Just "_ssTownshipDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssUnitType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ssCongressionalDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ssStateSenateDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssOddOrEvens") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))) :*: ((S1 (MetaSel (Just "_ssGeographicDivisionOcdIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_ssBeforeGeocodeId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssDataSetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) :*: (S1 (MetaSel (Just "_ssStartLngE7") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_ssCity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssWildcard") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))) :*: (((S1 (MetaSel (Just "_ssTargetsmartUniquePrecinctCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ssProvenances") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Provenance])) :*: S1 (MetaSel (Just "_ssSchoolDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ssMailOnly") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_ssId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssUnitNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_ssAdministrationRegionIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_ssVanPrecinctCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssJudicialDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ssPrecinctName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ssCountyFips") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssPrecinctOcdId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))))

Candidate

data Candidate Source #

Information about a candidate running for elected office.

See: candidate smart constructor.

Instances
Eq Candidate Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data Candidate Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Candidate Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Candidate :: Type -> Type #

ToJSON Candidate Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Candidate Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Candidate Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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. If this is a joint ticket it will indicate the name of the candidate at the top of a ticket followed by a / and that name of candidate at the bottom of the ticket. e.g. "Mitt Romney / Paul Ryan"

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Eq RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Data RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Read RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Show RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Generic RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Hashable RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToJSON RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromJSON RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromHttpApiData RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToHttpApiData RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByAddressLevels Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByAddressLevels = D1 (MetaData "RepresentativesRepresentativeInfoByAddressLevels" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (((C1 (MetaCons "RRIBALADMINISTRATIVEAREA1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBALADMINISTRATIVEAREA2" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "RRIBALCountry" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBALInternational" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "RRIBALLocality" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBALRegional" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "RRIBALSpecial" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "RRIBALSUBLOCALITY1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBALSUBLOCALITY2" PrefixI False) (U1 :: Type -> Type)))))

Office

data Office Source #

Information about an Office held by one or more Officials.

See: office smart constructor.

Instances
Eq Office Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

Data Office Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Office Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Office :: Type -> Type #

Methods

from :: Office -> Rep Office x #

to :: Rep Office x -> Office #

ToJSON Office Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Office Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Office Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Eq RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Data RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Read RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Show RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Generic RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Hashable RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToJSON RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromJSON RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromHttpApiData RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToHttpApiData RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByDivisionRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByDivisionRoles = D1 (MetaData "RepresentativesRepresentativeInfoByDivisionRoles" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (((C1 (MetaCons "DeputyHeadOfGovernment" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ExecutiveCouncil" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "GovernmentOfficer" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "HeadOfGovernment" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "HeadOfState" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "HighestCourtJudge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Judge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LegislatorLowerBody" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "LegislatorUpperBody" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SchoolBoard" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SpecialPurposeOfficer" PrefixI False) (U1 :: Type -> Type)))))

StreetSegmentList

data StreetSegmentList Source #

Instances
Eq StreetSegmentList Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data StreetSegmentList Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: StreetSegmentList -> Constr #

dataTypeOf :: StreetSegmentList -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StreetSegmentList Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic StreetSegmentList Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep StreetSegmentList :: Type -> Type #

ToJSON StreetSegmentList Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON StreetSegmentList Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep StreetSegmentList Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep StreetSegmentList = D1 (MetaData "StreetSegmentList" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "StreetSegmentList'" PrefixI True) (S1 (MetaSel (Just "_sslSegments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [StreetSegment]))))

streetSegmentList :: StreetSegmentList Source #

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

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

LivegraphBacktraceRecordInfo

data LivegraphBacktraceRecordInfo Source #

Instances
Eq LivegraphBacktraceRecordInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data LivegraphBacktraceRecordInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: LivegraphBacktraceRecordInfo -> Constr #

dataTypeOf :: LivegraphBacktraceRecordInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LivegraphBacktraceRecordInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic LivegraphBacktraceRecordInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep LivegraphBacktraceRecordInfo :: Type -> Type #

ToJSON LivegraphBacktraceRecordInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON LivegraphBacktraceRecordInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep LivegraphBacktraceRecordInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep LivegraphBacktraceRecordInfo = D1 (MetaData "LivegraphBacktraceRecordInfo" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "LivegraphBacktraceRecordInfo'" PrefixI True) ((((S1 (MetaSel (Just "_lbriDataSourcePublishMsec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_lbriTopicBuildStartMsec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_lbriIsRecon") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_lbriPriority") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_lbriShouldMonitorLatency") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_lbriRecordId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_lbriProxySentMsec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_lbriExpInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LivegraphBacktraceRecordInfoExpInfo))))) :*: (((S1 (MetaSel (Just "_lbriProcess") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lbriTopicBuildFinishMsec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_lbriNumberOfTriples") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_lbriProxyReceiveMsec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) :*: ((S1 (MetaSel (Just "_lbriVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lbriIsWlmThrottled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_lbriExpId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lbriSubscriberReceiveMsec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))))

ElectionsQueryRequest

data ElectionsQueryRequest Source #

Instances
Eq ElectionsQueryRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data ElectionsQueryRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: ElectionsQueryRequest -> Constr #

dataTypeOf :: ElectionsQueryRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ElectionsQueryRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic ElectionsQueryRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep ElectionsQueryRequest :: Type -> Type #

ToJSON ElectionsQueryRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON ElectionsQueryRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectionsQueryRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectionsQueryRequest = D1 (MetaData "ElectionsQueryRequest" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "ElectionsQueryRequest'" PrefixI True) (S1 (MetaSel (Just "_eqrContextParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ContextParams))))

electionsQueryRequest :: ElectionsQueryRequest Source #

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

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

Channel

data Channel Source #

A social media or web channel for a candidate.

See: channel smart constructor.

Instances
Eq Channel Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

Data Channel Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Channel Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Channel :: Type -> Type #

Methods

from :: Channel -> Rep Channel x #

to :: Rep Channel x -> Channel #

ToJSON Channel Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Channel Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Channel Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Channel = D1 (MetaData "Channel" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "Channel'" PrefixI True) (S1 (MetaSel (Just "_cId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data Election Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Election Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Election :: Type -> Type #

Methods

from :: Election -> Rep Election x #

to :: Rep Election x -> Election #

ToJSON Election Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Election Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Election Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Election = D1 (MetaData "Election" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "Election'" PrefixI True) ((S1 (MetaSel (Just "_eOcdDivisionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eElectionDay") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_eName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data RepresentativeInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic RepresentativeInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep RepresentativeInfoResponse :: Type -> Type #

ToJSON RepresentativeInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON RepresentativeInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoResponse = D1 (MetaData "RepresentativeInfoResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "RepresentativeInfoResponse'" PrefixI True) ((S1 (MetaSel (Just "_rirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_rirNormalizedInput") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType))) :*: (S1 (MetaSel (Just "_rirOfficials") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Official])) :*: (S1 (MetaSel (Just "_rirDivisions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepresentativeInfoResponseDivisions)) :*: S1 (MetaSel (Just "_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.

VoterInfoSegmentResult

data VoterInfoSegmentResult Source #

Instances
Eq VoterInfoSegmentResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data VoterInfoSegmentResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: VoterInfoSegmentResult -> Constr #

dataTypeOf :: VoterInfoSegmentResult -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VoterInfoSegmentResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic VoterInfoSegmentResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep VoterInfoSegmentResult :: Type -> Type #

ToJSON VoterInfoSegmentResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON VoterInfoSegmentResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep VoterInfoSegmentResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep VoterInfoSegmentResult = D1 (MetaData "VoterInfoSegmentResult" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "VoterInfoSegmentResult'" PrefixI True) ((S1 (MetaSel (Just "_visrResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe VoterInfoResponse)) :*: S1 (MetaSel (Just "_visrGeneratedMillis") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_visrPostalAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PostalAddress)) :*: S1 (MetaSel (Just "_visrRequest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe VoterInfoRequest)))))

voterInfoSegmentResult :: VoterInfoSegmentResult Source #

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

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

DivisionSearchResult

data DivisionSearchResult Source #

Represents a political geographic division that matches the requested query.

See: divisionSearchResult smart constructor.

Instances
Eq DivisionSearchResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data DivisionSearchResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic DivisionSearchResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep DivisionSearchResult :: Type -> Type #

ToJSON DivisionSearchResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON DivisionSearchResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionSearchResult Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionSearchResult = D1 (MetaData "DivisionSearchResult" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "DivisionSearchResult'" PrefixI True) (S1 (MetaSel (Just "_dsrAliases") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_dsrName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_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.

DivisionSearchRequest

data DivisionSearchRequest Source #

A search request for political geographies.

See: divisionSearchRequest smart constructor.

Instances
Eq DivisionSearchRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data DivisionSearchRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: DivisionSearchRequest -> Constr #

dataTypeOf :: DivisionSearchRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DivisionSearchRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic DivisionSearchRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep DivisionSearchRequest :: Type -> Type #

ToJSON DivisionSearchRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON DivisionSearchRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionSearchRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionSearchRequest = D1 (MetaData "DivisionSearchRequest" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "DivisionSearchRequest'" PrefixI True) (S1 (MetaSel (Just "_dsrContextParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ContextParams))))

divisionSearchRequest :: DivisionSearchRequest Source #

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

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

FieldMetadataProto

data FieldMetadataProto Source #

Instances
Eq FieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data FieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: FieldMetadataProto -> Constr #

dataTypeOf :: FieldMetadataProto -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic FieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep FieldMetadataProto :: Type -> Type #

ToJSON FieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON FieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep FieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep FieldMetadataProto = D1 (MetaData "FieldMetadataProto" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "FieldMetadataProto'" PrefixI True) (S1 (MetaSel (Just "_fmpInternal") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe InternalFieldMetadataProto))))

fieldMetadataProto :: FieldMetadataProto Source #

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

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

MessageSet

data MessageSet Source #

Instances
Eq MessageSet Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data MessageSet Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: MessageSet -> Constr #

dataTypeOf :: MessageSet -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MessageSet Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic MessageSet Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep MessageSet :: Type -> Type #

ToJSON MessageSet Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON MessageSet Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep MessageSet Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep MessageSet = D1 (MetaData "MessageSet" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "MessageSet'" PrefixI True) (S1 (MetaSel (Just "_msRecordMessageSetExt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe LivegraphBacktraceRecordInfo))))

messageSet :: MessageSet Source #

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

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

AdministrativeBody

data AdministrativeBody Source #

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

See: administrativeBody smart constructor.

Instances
Eq AdministrativeBody Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data AdministrativeBody Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic AdministrativeBody Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep AdministrativeBody :: Type -> Type #

ToJSON AdministrativeBody Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON AdministrativeBody Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep AdministrativeBody Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep AdministrativeBody = D1 (MetaData "AdministrativeBody" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "AdministrativeBody'" PrefixI True) (((S1 (MetaSel (Just "_abCorrespondenceAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType)) :*: (S1 (MetaSel (Just "_abAbsenteeVotingInfoURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_abHoursOfOperation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_abBallotInfoURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_abPhysicalAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleAddressType))) :*: (S1 (MetaSel (Just "_abElectionRegistrationConfirmationURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_abElectionInfoURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_abVotingLocationFinderURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_abElectionOfficials") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ElectionOfficial])) :*: S1 (MetaSel (Just "_abName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_abElectionRulesURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_abAddressLines") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_abVoterServices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_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.

RepresentativeInfoRequest

data RepresentativeInfoRequest Source #

A request for political geography and representative information for an address.

See: representativeInfoRequest smart constructor.

Instances
Eq RepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data RepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: RepresentativeInfoRequest -> Constr #

dataTypeOf :: RepresentativeInfoRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic RepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep RepresentativeInfoRequest :: Type -> Type #

ToJSON RepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON RepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoRequest = D1 (MetaData "RepresentativeInfoRequest" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "RepresentativeInfoRequest'" PrefixI True) (S1 (MetaSel (Just "_rirContextParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ContextParams))))

representativeInfoRequest :: RepresentativeInfoRequest Source #

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

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

Contest

data Contest Source #

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

See: contest smart constructor.

Instances
Eq Contest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

Data Contest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Contest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Contest :: Type -> Type #

Methods

from :: Contest -> Rep Contest x #

to :: Rep Contest x -> Contest #

ToJSON Contest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Contest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Contest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Contest = D1 (MetaData "Contest" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "Contest'" PrefixI True) ((((S1 (MetaSel (Just "_conReferendumPassageThreshold") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conRoles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_conReferendumURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_conReferendumEffectOfAbstain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conReferendumSubtitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conNumberVotingFor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) :*: ((S1 (MetaSel (Just "_conOffice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conReferendumConStatement") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conSources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Source])))) :*: (S1 (MetaSel (Just "_conReferendumProStatement") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conReferendumBallotResponses") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_conNumberElected") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))) :*: (((S1 (MetaSel (Just "_conSpecial") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conReferendumText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conPrimaryParty") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_conId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conBallotTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_conElectorateSpecifications") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conReferendumBrief") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conDistrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ElectoralDistrict)))) :*: ((S1 (MetaSel (Just "_conLevel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_conCandidates") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Candidate]))) :*: (S1 (MetaSel (Just "_conReferendumTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_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. 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'. For Retention contests this will typically be 'Retention'.

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

The official title on the ballot for this contest, only where available.

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data DivisionSearchResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic DivisionSearchResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep DivisionSearchResponse :: Type -> Type #

ToJSON DivisionSearchResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON DivisionSearchResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionSearchResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionSearchResponse = D1 (MetaData "DivisionSearchResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "DivisionSearchResponse'" PrefixI True) (S1 (MetaSel (Just "_dsrResults") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DivisionSearchResult])) :*: S1 (MetaSel (Just "_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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data RepresentativeInfoDataDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic RepresentativeInfoDataDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep RepresentativeInfoDataDivisions :: Type -> Type #

ToJSON RepresentativeInfoDataDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON RepresentativeInfoDataDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoDataDivisions Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoDataDivisions = D1 (MetaData "RepresentativeInfoDataDivisions" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "RepresentativeInfoDataDivisions'" PrefixI True) (S1 (MetaSel (Just "_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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Eq RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Data RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Read RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Show RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Generic RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

Hashable RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToJSON RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromJSON RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

FromHttpApiData RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

ToHttpApiData RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByAddressRoles Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Sum

type Rep RepresentativesRepresentativeInfoByAddressRoles = D1 (MetaData "RepresentativesRepresentativeInfoByAddressRoles" "Network.Google.CivicInfo.Types.Sum" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (((C1 (MetaCons "RRIBARDeputyHeadOfGovernment" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBARExecutiveCouncil" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "RRIBARGovernmentOfficer" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "RRIBARHeadOfGovernment" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBARHeadOfState" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "RRIBARHighestCourtJudge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "RRIBARJudge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBARLegislatorLowerBody" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "RRIBARLegislatorUpperBody" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "RRIBARSchoolBoard" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RRIBARSpecialPurposeOfficer" PrefixI False) (U1 :: Type -> Type)))))

ElectionOfficial

data ElectionOfficial Source #

Information about individual election officials.

See: electionOfficial smart constructor.

Instances
Eq ElectionOfficial Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data ElectionOfficial Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic ElectionOfficial Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep ElectionOfficial :: Type -> Type #

ToJSON ElectionOfficial Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON ElectionOfficial Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectionOfficial Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectionOfficial = D1 (MetaData "ElectionOfficial" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "ElectionOfficial'" PrefixI True) ((S1 (MetaSel (Just "_eoFaxNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eoName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_eoOfficePhoneNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_eoEmailAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_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.

PointProto

data PointProto Source #

Instances
Eq PointProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data PointProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: PointProto -> Constr #

dataTypeOf :: PointProto -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PointProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic PointProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep PointProto :: Type -> Type #

ToJSON PointProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON PointProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep PointProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep PointProto = D1 (MetaData "PointProto" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "PointProto'" PrefixI True) ((S1 (MetaSel (Just "_ppLatE7") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_ppLngE7") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))) :*: (S1 (MetaSel (Just "_ppMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FieldMetadataProto)) :*: S1 (MetaSel (Just "_ppTemporaryData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageSet)))))

pointProto :: PointProto Source #

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

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

RepresentativeInfoData

data RepresentativeInfoData Source #

Instances
Eq RepresentativeInfoData Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data RepresentativeInfoData Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic RepresentativeInfoData Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep RepresentativeInfoData :: Type -> Type #

ToJSON RepresentativeInfoData Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON RepresentativeInfoData Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoData Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep RepresentativeInfoData = D1 (MetaData "RepresentativeInfoData" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "RepresentativeInfoData'" PrefixI True) (S1 (MetaSel (Just "_ridOfficials") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Official])) :*: (S1 (MetaSel (Just "_ridDivisions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepresentativeInfoDataDivisions)) :*: S1 (MetaSel (Just "_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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

Data Source Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Source Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Source :: Type -> Type #

Methods

from :: Source -> Rep Source x #

to :: Rep Source x -> Source #

ToJSON Source Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Source Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Source Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Source = D1 (MetaData "Source" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "Source'" PrefixI True) (S1 (MetaSel (Just "_sName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_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.

DivisionRepresentativeInfoRequest

data DivisionRepresentativeInfoRequest Source #

A request to look up representative information for a single division.

See: divisionRepresentativeInfoRequest smart constructor.

Instances
Eq DivisionRepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data DivisionRepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: DivisionRepresentativeInfoRequest -> Constr #

dataTypeOf :: DivisionRepresentativeInfoRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DivisionRepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic DivisionRepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep DivisionRepresentativeInfoRequest :: Type -> Type #

ToJSON DivisionRepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON DivisionRepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionRepresentativeInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep DivisionRepresentativeInfoRequest = D1 (MetaData "DivisionRepresentativeInfoRequest" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "DivisionRepresentativeInfoRequest'" PrefixI True) (S1 (MetaSel (Just "_drirContextParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ContextParams))))

divisionRepresentativeInfoRequest :: DivisionRepresentativeInfoRequest Source #

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

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

ElectoralDistrict

data ElectoralDistrict Source #

Describes the geographic scope of a contest.

See: electoralDistrict smart constructor.

Instances
Eq ElectoralDistrict Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data ElectoralDistrict Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic ElectoralDistrict Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep ElectoralDistrict :: Type -> Type #

ToJSON ElectoralDistrict Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON ElectoralDistrict Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectoralDistrict Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectoralDistrict = D1 (MetaData "ElectoralDistrict" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "ElectoralDistrict'" PrefixI True) ((S1 (MetaSel (Just "_edKgForeignKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_edName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_edScope") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_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.

VoterInfoRequest

data VoterInfoRequest Source #

A request for information about a voter.

See: voterInfoRequest smart constructor.

Instances
Eq VoterInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data VoterInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: VoterInfoRequest -> Constr #

dataTypeOf :: VoterInfoRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VoterInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic VoterInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep VoterInfoRequest :: Type -> Type #

ToJSON VoterInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON VoterInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep VoterInfoRequest Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep VoterInfoRequest = D1 (MetaData "VoterInfoRequest" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "VoterInfoRequest'" PrefixI True) (S1 (MetaSel (Just "_virVoterInfoSegmentResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe VoterInfoSegmentResult)) :*: S1 (MetaSel (Just "_virContextParams") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ContextParams))))

voterInfoRequest :: VoterInfoRequest Source #

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

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

SimpleAddressType

data SimpleAddressType Source #

A simple representation of an address.

See: simpleAddressType smart constructor.

Instances
Eq SimpleAddressType Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data SimpleAddressType Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic SimpleAddressType Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep SimpleAddressType :: Type -> Type #

ToJSON SimpleAddressType Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON SimpleAddressType Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep SimpleAddressType Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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.

InternalSourceSummaryProto

data InternalSourceSummaryProto Source #

Instances
Eq InternalSourceSummaryProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data InternalSourceSummaryProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: InternalSourceSummaryProto -> Constr #

dataTypeOf :: InternalSourceSummaryProto -> DataType #

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

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

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

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

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

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

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

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

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

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

Show InternalSourceSummaryProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic InternalSourceSummaryProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep InternalSourceSummaryProto :: Type -> Type #

ToJSON InternalSourceSummaryProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON InternalSourceSummaryProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep InternalSourceSummaryProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep InternalSourceSummaryProto = D1 (MetaData "InternalSourceSummaryProto" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "InternalSourceSummaryProto'" PrefixI True) (S1 (MetaSel (Just "_isspDataSet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_isspProvider") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

internalSourceSummaryProto :: InternalSourceSummaryProto Source #

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

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

LivegraphBacktraceRecordInfoExpInfo

data LivegraphBacktraceRecordInfoExpInfo Source #

Instances
Eq LivegraphBacktraceRecordInfoExpInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data LivegraphBacktraceRecordInfoExpInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: LivegraphBacktraceRecordInfoExpInfo -> Constr #

dataTypeOf :: LivegraphBacktraceRecordInfoExpInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LivegraphBacktraceRecordInfoExpInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic LivegraphBacktraceRecordInfoExpInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

ToJSON LivegraphBacktraceRecordInfoExpInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON LivegraphBacktraceRecordInfoExpInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep LivegraphBacktraceRecordInfoExpInfo Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep LivegraphBacktraceRecordInfoExpInfo = D1 (MetaData "LivegraphBacktraceRecordInfoExpInfo" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "LivegraphBacktraceRecordInfoExpInfo'" PrefixI True) (S1 (MetaSel (Just "_lbrieiDeletedIns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

livegraphBacktraceRecordInfoExpInfo :: LivegraphBacktraceRecordInfoExpInfo Source #

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

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

ContextParams

data ContextParams Source #

Instances
Eq ContextParams Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data ContextParams Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: ContextParams -> Constr #

dataTypeOf :: ContextParams -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ContextParams Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic ContextParams Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep ContextParams :: Type -> Type #

ToJSON ContextParams Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON ContextParams Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ContextParams Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ContextParams = D1 (MetaData "ContextParams" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" True) (C1 (MetaCons "ContextParams'" PrefixI True) (S1 (MetaSel (Just "_cpClientProFile") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

contextParams :: ContextParams Source #

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

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

PostalAddress

data PostalAddress Source #

Instances
Eq PostalAddress Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data PostalAddress Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: PostalAddress -> Constr #

dataTypeOf :: PostalAddress -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PostalAddress Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic PostalAddress Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep PostalAddress :: Type -> Type #

ToJSON PostalAddress Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON PostalAddress Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep PostalAddress Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep PostalAddress = D1 (MetaData "PostalAddress" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "PostalAddress'" PrefixI True) ((((S1 (MetaSel (Just "_paAdministrativeAreaName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_paRecipientName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_paLanguageCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_paSortingCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_paPremiseName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_paPostalCodeNumberExtension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_paCountryNameCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_paSubAdministrativeAreaName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_paPostBoxNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_paLocalityName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) :*: (((S1 (MetaSel (Just "_paIsDisputed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_paThoroughfareNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_paDependentLocalityName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_paFirmName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_paCountryName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_paDependentThoroughfareName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_paAddressLines") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_paPostalCodeNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_paThoroughfareName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_paSubPremiseName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

InternalFieldMetadataProto

data InternalFieldMetadataProto Source #

Instances
Eq InternalFieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data InternalFieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: InternalFieldMetadataProto -> Constr #

dataTypeOf :: InternalFieldMetadataProto -> DataType #

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

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

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

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

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

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

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

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

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

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

Show InternalFieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic InternalFieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep InternalFieldMetadataProto :: Type -> Type #

ToJSON InternalFieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON InternalFieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep InternalFieldMetadataProto Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep InternalFieldMetadataProto = D1 (MetaData "InternalFieldMetadataProto" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "InternalFieldMetadataProto'" PrefixI True) (S1 (MetaSel (Just "_ifmpSourceSummary") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InternalSourceSummaryProto)) :*: S1 (MetaSel (Just "_ifmpIsAuto") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

internalFieldMetadataProto :: InternalFieldMetadataProto Source #

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

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

AdministrationRegion

data AdministrationRegion Source #

Describes information about a regional election administrative area.

See: administrationRegion smart constructor.

Instances
Eq AdministrationRegion Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data AdministrationRegion Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic AdministrationRegion Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep AdministrationRegion :: Type -> Type #

ToJSON AdministrationRegion Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON AdministrationRegion Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep AdministrationRegion Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep AdministrationRegion = D1 (MetaData "AdministrationRegion" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "AdministrationRegion'" PrefixI True) ((S1 (MetaSel (Just "_arLocalJurisdiction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AdministrationRegion)) :*: S1 (MetaSel (Just "_arSources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Source]))) :*: (S1 (MetaSel (Just "_arName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_arElectionAdministrationBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AdministrativeBody)) :*: S1 (MetaSel (Just "_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.

Provenance

data Provenance Source #

Instances
Eq Provenance Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data Provenance Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Methods

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

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

toConstr :: Provenance -> Constr #

dataTypeOf :: Provenance -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Provenance Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Provenance Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Provenance :: Type -> Type #

ToJSON Provenance Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Provenance Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Provenance Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

provenance :: Provenance Source #

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

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

ElectionsQueryResponse

data ElectionsQueryResponse Source #

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

See: electionsQueryResponse smart constructor.

Instances
Eq ElectionsQueryResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data ElectionsQueryResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic ElectionsQueryResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep ElectionsQueryResponse :: Type -> Type #

ToJSON ElectionsQueryResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON ElectionsQueryResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectionsQueryResponse Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep ElectionsQueryResponse = D1 (MetaData "ElectionsQueryResponse" "Network.Google.CivicInfo.Types.Product" "gogol-civicinfo-0.5.0-7VOj7ZZm573JP0mSHaxA8n" False) (C1 (MetaCons "ElectionsQueryResponse'" PrefixI True) (S1 (MetaSel (Just "_eqrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Data Official Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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 # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Generic Official Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

Associated Types

type Rep Official :: Type -> Type #

Methods

from :: Official -> Rep Official x #

to :: Rep Official x -> Official #

ToJSON Official Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

FromJSON Official Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

type Rep Official Source # 
Instance details

Defined in Network.Google.CivicInfo.Types.Product

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.