Background

This is a pilot of an experimental manipulation of class zero-sum beliefs. This was the order of the study: (1) manipulation; (2) random order of (a) class zs and (b) class solidarity (there were two randomly ordered class solidarity measures; (3) policy support; (4) random order of (a) upper class responsibility and (b) threat; (5) politics; (6) demographics (including identification as working class).

For recruitment, I set the following criteria on connect: Bachelor’s degree and below; $100k annual income and below; 30% democrats; 30% republicans, 40% independents.

Demographics

Race

df_cbzs_elg %>% 
  group_by(race) %>% 
  summarise(N = n()) %>% 
  ungroup() %>% 
  mutate(Perc = round(100*(N/sum(N)),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
race N Perc
American Indian or Alaska Native 1 0.33
Asian 16 5.33
Black or African American 34 11.33
Hispanic, Latino, or Spanish origin 15 5.00
Other (please specify) 2 0.67
White 212 70.67
multiracial 20 6.67

Gender

df_cbzs_elg %>% 
  mutate(gender = ifelse(is.na(gender) | gender == "","other",gender)) %>% 
  group_by(gender) %>% 
  summarise(N = n()) %>% 
  ungroup() %>% 
  mutate(Perc = round(100*(N/sum(N)),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
gender N Perc
man 147 49.00
other 4 1.33
woman 149 49.67

Age

df_cbzs_elg %>% 
  summarise(age_mean = round(mean(age,na.rm = T),2),
            age_sd = round(sd(age,na.rm = T),2)) %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
age_mean age_sd
40.21 12.82

Education

df_cbzs_elg %>% 
  group_by(edu) %>% 
  summarise(N = n()) %>% 
  ungroup() %>% 
  mutate(Perc = round(100*(N/sum(N)),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
edu N Perc
noHS 1 0.33
GED 102 34.00
2yearColl 61 20.33
4yearColl 132 44.00
MA 3 1.00
PHD 1 0.33

Subjective SES

df_cbzs_elg %>% 
  group_by(ses) %>% 
  summarise(N = n()) %>% 
  ungroup() %>% 
  mutate(Perc = round(100*(N/sum(N)),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
ses N Perc
Lower Class 44 14.67
Lower Middle Class 99 33.00
Middle Class 142 47.33
Upper Middle Class 15 5.00

Identification as working class

To what extent do you see yourself as part of the working class?

df_cbzs_elg %>% 
  ggplot(aes(x = wrkclass)) +
  geom_histogram(fill = "lightblue",
                 color = "lightblue",
                 binwidth = 1) +
  scale_x_continuous(breaks = seq(1,5,1),
                     limits = c(0,6)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$wrkclass,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Income

df_cbzs_elg %>% 
  ggplot(aes(x = income)) +
  geom_bar() +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_blank(),
        axis.title.y = element_blank()) +
  coord_flip()

Politics

Ideology

Participants were asked about the extent to which they subscribe to the following ideologies on a scale of 1-7 (select NA if unfamiliar): Conservatism, Liberalism, Democratic Socialism, Libertarianism, Progressivism.

means <- df_cbzs_elg %>%
  dplyr::select(PID,ideo_con:ideo_prog) %>% 
  pivot_longer(-PID,
               names_to = "ideo",
               values_to = "score") %>% 
  filter(!is.na(score)) %>% 
  group_by(ideo) %>% 
  summarise(score = mean(score)) %>% 
  ungroup()

df_cbzs_elg %>%
  dplyr::select(PID,ideo_con:ideo_prog) %>% 
  pivot_longer(-PID,
               names_to = "ideo",
               values_to = "score") %>% 
  filter(!is.na(score)) %>%  
  ggplot() +
  geom_density(aes(x = score), fill = "lightblue") +
  scale_x_continuous(limits = c(1,7),
                     breaks = seq(1,7,1)) +
  geom_vline(data = means,mapping = aes(xintercept = score),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold")) +
  facet_wrap(~ideo,nrow = 2)

Party affiliation

df_cbzs_elg %>% 
  group_by(party_id) %>% 
  summarise(N = n()) %>% 
  ungroup() %>% 
  mutate(Perc = round(100*(N/sum(N)),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
party_id N Perc
Democrat 107 35.67
Independent 98 32.67
Republican 95 31.67

Vote 2024

df_cbzs_elg %>% 
  group_by(vote_2024) %>% 
  summarise(N = n()) %>% 
  ungroup() %>% 
  mutate(Perc = round(100*(N/sum(N)),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
vote_2024 N Perc
Donald Trump 101 33.67
I did not vote 44 14.67
Kamala Harris 140 46.67
Other 15 5.00

Reflections

In a few sentences, please reflect on the ways in which the excerpt above describes how the economic system works?

Zero-sum condition

reflection
The upper class has constructed a system in which they enrich themselves at the expense of those that earn less. The system is set up so that the rich get richer and the poor earn wealth for the rich.
The rich use their influence to steal from the working class, and increase the gap between the haves and the have-nots.
The system work by the wealthy creating the system to extract as much wealth from the working class as possible. They so this by creating tax breaks and lobbying for anti worker laws. THey go with the cheapest labor and put the expense on everyone else.
This is an extremely accurate take on how the economic system works. Our Congress in the US is mainly comprised of rich people who are getting lobbied by rich people to shape laws that benefit rich people, and we have half of the working class on their side because they think that some day they’ll be able to exploit others too.
This excerpt describes that the upper class has more wealth and influence than lower working class people.
The wealthy remain wealthy while the poor remain poor. This has always been the case in our economy. There are strategies designed by the wealthy and powerful to manipulate the system so they can best benefit from it, all the while undermining the working class.
I do believe that this excerpt demonstrates how wealth inequalities are perpetuated, making upward mobility less and less possible. It is especially difficult when political leadership continues this narrative, but it is common, particularly within republicans.
It is trying to say that the wealthy are killing off the working class.
it has always been like this workers will never gain the upper hand unless drastic measures are taken
The excerpt says the wealthy have rigged the economy to get richer while working people suffer. They do this by influencing laws and lowering wages.
Pretty much the wealthy are using the working class. They keep us right where they want us by manipulating the system so we constantly struggle to find good paying jobs and keep them.
The excerpt explains how the upper class have designed a system in which the working class suffers from their decisions in the forms of tax breaks and other laws that have been put in place. The modern economic system is designed in a way so that the rich get richer, and the working class is left to be doing just that - all the work.
The excerpt above believes that the in the modern economy, the upper class’s wealth collectively has been much more than the collective wealth of the working class. This is due to a few reasons. For one, they have been lobbying legislators for tax breaks and anti-worker laws. Not only that, they also cut down on wages and choose to outsource their work to cheaper labor.
The upper class is stimulating the economy to the point where it is detrimental to the working class. By outsourcing, they upper class is getting cheaper labor and taking jobs away from the working class.
Those who end up in the upper / elite class, end up benefitting from taking advantage of the working class. This includes influencing policies that take advantage of workers and give themselves tax breaks.
This economic system caters to the wealthy at the severe expense of the working class. In this system, the gap in quality of life, generally-speaking, between upper and lower class is comparable to a slaver-slave relationship.
People with more wealth and influence the economic system in ways that benefit them. Unfortunately working people are paying the price for this.
This excerpt explains that the rich buisness owners of America continue to make more and more money, while the average blue collar worker gets left behind. Because they have more money, they have more power, and because they have more power they are able to influence tax breaks and laws that help them.
It claims that the rich elites are benefiting from taking from the lower class, knowingly and repeatedly. They use tax breaks and anti-worker laws to shape the system.
The working class has been left behind while those in the upper classes accumulate more wealth and power. The upper classes have used their influence to shape the system at the expense of the lower classes. They are benefiting and set it up to do so.
I think the above passage is correct, and I think the most obvious example is this is the enormous wealth transfer from the middle/lower class from the upper class as a result of the COVID-19 pandemic.
Upper class are slashing our wages or outsourcing our jobs. The middle and low class are making less money but working twice as hard.
I think this is completely inaccurate. Everyone is paying more nowadays. Upper and middle class pay a lot for everything because of inflation
It is made so that the elites are getting more than anyone else and it is by design.
I agree with the overall sentiment of the excerpt concerning the current economic system. It seems to be human nature to be as greedy as possible and never be satisfied with what you have. Those with wealth and influence use their status to gain even more wealth and influence no matter the cost to anyone who isn’t them. In their eyes, workers are all lazy who are overpaid and do nothing while they are these special figures who deserve everything and anything they want. They always want more tax breaks and special privileges.
The upper class uses their money and influence to make the economy and laws favor them so they always stay in their status, and other cannot rise up.
The one thing this excerpt leaves off is how it is politically driven. It is Republicans who make sure the 1% grows and the bottom 99 get left out. They do inside trading, deals that benefit them, while leaving minimum wage the same and crashing the job market.
The upper class unfairly gets more breaks than the middle and working class
The excerpt above describes a powerful political elite which manipulates the system to benefit them, politically, socially and financially. This is a deliberate design to take money from the poor or working people and shift it to those in power.
The economic system that is in place in America has been constructed by the elite class for its own benefit. The system has been slated to exploit the working class for the benefit of the wealthy in an unethical way. This has been done through lobbying and political strategies over the years. it is not right.
Wealthy people have created ways to make the system work to their advantage by creating tax breaks for the wealthy and keeping wages low. It makes the wealth even wealthier and keeps people in the middle class from ever getting ahead.
The wealthy in America have the most influence due to their monetary worth. They are constantly structuring capitalism to benefit themselves and harm the working class, keeping the most struggling people down so that they may never outnumber them. The rich can also lobby for other rich people to keep them and themselves rich.
The system is rigged for the global elites against the common working man, as they have outsourced good paying jobs to countries with cheap labor, and have created tax incentives that benefit the rich while punishing the laborers.
This makes me think that they are trying to completely eliminate the working/middle class. The rich get richer while everyone else stays the same with no opportunity to move up.
The excerpt gives us hope on how things can be easily handled and gives credit for the economy.

The article is saying the elites are preventing the middle class from getting ahead. There are very little economic advantages for them. The Elites are only looking after themselves. They are not bringing businesses to our country for the middle class to work.

The middle class isn’t benefitting.
I think this is correct. Just looking at recent tax changes, the majority of cuts have been for the wealthy. They hold the power and the purse strings so they can effectively do things to benefit themselves at the expense of the middle and lower classes.
the rich and affluent class have acquired more wealth by taking advantage of the system. they use their power to suppress tax and workers laws that only benefit them.
The entire global economy has been getting worse and worse for the average person since the money printing era began in 2008 when capitalism ended. The governments of the world have printed over $50 trillion of bailouts and stimulus money during this timeframe. The rich have hoovered it all up into their bank accounts leaving the average person to be destroyed by inflation. The more money they print the more corrupt the politicians get that are all bought and paid for by the rich. They constantly pass new laws to screw over the working class people, give themselves massive tax cuts and loopholes, while getting richer and richer by the day from the printed money leaking into the stock market and other assets in the everything bubble we now live in.
The economy right now works in that the upper class have more money than ever while the average working class is struggling. The upper class has way too much sway on the economy so they benefit from the system. It is a calculated attempt to raise themselves up at our expense.
The economic system takes from the poor and gives to the rich by keeping wages low and prices high. The financial markets are rigged to provide access to participation to those who are wealthy only.
The upper class takes advantage of things and the working class suffers
The excerpt above describes how the economic system is controlled by powerful elites. These elites use their money to create the system to benefit themselves from the working class, at the same time preventing the working class from gaining anything if at all. They can pay less taxes than they earn compared to the working class.
The rich are getting richer while the poor struggles. The upper class will always be successful and no other class can catch up. They will have have an advantage over the working class.
The message above accuses the upper class elites of manipulating the economy and infrastructure in ways that benefit themselves but take advantage of and punish the little guys or the common working man and woman. The Joe Sixpacks of the world are deliberately being shafted according to the passage above.
The upper class has been taking advantage of the working class by rigging the system. They are using strategies like outsourcing jobs, lobbying for tax breaks and much more.
Rich people are manipulating the economy to their benefit. The way they are doing it is lobbying for tax breaks and using anti-worker laws.
The excerpt describes how political and social elites have influenced and changed the system to benefit themselves. This is done in a way that keeps boots on the necks of the lower and middle class who suffer at the other end of these policies.
It highlights that the wealthy have shaped the economy to serve their own interests by influencing laws, lowering wages, and limiting opportunities for workers, making it harder for the working class to succeed.
The economic system is skewed towards the powerful and wealthy. These individuals are the decision makers at the highest levels-Corporate and Government. They are in a position that enable them to enact policies that enrich themselves at the expense of the working class. Making the divide between the poor and wealthy greater than it ever has been.
The economic system shouldn’t work this way but it does. All of the elites are heading our country and it appears they are only out for financial gain for themselves, with no cares at all about us working class people. They want to get rid of unions and fire government workers and slash programs that benefit us, all to get more money for their own government contracts.
The rich keep getting richer. The poor and middle class cannot move up in the world, with the wealthy getting wealthier. The wealthy benefit by getting tax breaks and more opportunities.
The economic system in the United States is rigged against less-affluent Americans. The rich have an outsized influence on the economic system, from the minimum wage to repressive taxation. The rich deliberately engorge themselves at the expense of the poor.
I think that a few rich people, the “one percent” exploit the capitalist system in America. They enjoy sweetheart capital gains tax rates unions have been decimated, and we have clownshow rich person in the White House promising more tax cuts for the rich.
The wealthy have made the economic system work for them only and not for any other class of people in America. They have used their power to hurt others so that the lower classes can not get ahead.They hurt the system by only giving to one class and this keeps everything the same and does not progress.
The passage says rich people have made the system work better for them and worse for regular workers. They do things like push for laws that help them and move jobs away to pay less.
The rich are creating conditions where those under them have less and they reap the rewards of others misfortune.
The wealthy continue to get wealthier. This is on purpose and it takes from the working class.
Lobbying for taxes breaks and anti workers law Outsourcing jobs and slashing wages. In a way that the concept of equality is now a myth, workers get underpaid just to fill the pockets of the upper class
The upper class has worked the system so they grow wealth at the expense of the working class. They do this by lobbying for tax breaks and laws against workers and outsourcing labor.
in modern economy the working class is often left behind and the upper class has been gaining more and more wealth. This is a strategy used by the elite, to take and take from the working class. They want them to be rendered useless and always in the same position while they gain and gain and gain.
Company’s seek out cheaper labor in areas such as foreign countries to maximize profits. They also higher lower qualified and vulnerable employees to keep costs down and profits up.
That the upper class controls the economy. They constructed it in a way that benefits them and keeps them in power over everyone else.
The upper class is controlling the working class making it almost impossible to achieve any financial independence.
The excerpt above describes the economy as working to only benefit the upper class. That the upper class elite has rigged it to their advantage so that the upper class remains wealthy, and the lower class remains poor.
It says that the upper class has the economic system serve their interests while leaving the working people in the dust. This manipulation of the system leads to outcomes where working people face stagnating wages, job outsourcing, and an overall diminishing quality of life, all structured to benefit the elite at their expense.
The excerpt explains that upper class citizens rig the economic system to make themselves richer, while working people are left behind. They come up with different strategies to do this and make their influence on the system greater. The upper class not only have helped construct it, they benefit the most from it.
They have been moving people around. As some people become poorer, other people are being moved in to take their place, funded by the government and fake charities. The people are being vetted on arrival by elites and their representatives. Quite a bit of the vetting appears to take place through “homeless outreach”, but none of the people being let in are homeless, they all have homes where they are from.
The excerpt describes an economic system that is deliberately structured to favor the upper class at the expense of working people. It argues that the wealth and influence of the elite are not accidental but the result of strategic manipulation—through policies like tax breaks, anti-worker laws, wage suppression, and outsourcing. Essentially, it portrays the system as one designed to systematically extract value from the working class to enrich the wealthy, reinforcing inequality over time.
The economic system works by putting the upper class at an advantage at the expense of the working class. They do this by lobbying for tax breaks and laws that put the working class at a disadvantage.
The excerpt above states how the upper class has gained more wealth and influence than ever which results in working people and lower income being left behind. This is a calculated thing and is done by slashing wages and outsourcing jobs to make it cheaper for the upper class. The system has been constructed to benefit the upper class at the expense of the lower class.
The above exerpt seems to imply that the economic system (I’m assuming the United States, or other capitalist countries) is designed and fine-tuned to benefit the most wealthy amongst the population, usually at the expense of everyone else, especially the working class and the poor. By using both government regulation and cultural expectations of individualism and “pulling oneself up by one’s bootstraps”, there remains little support for more egalitarian safety nets and forms of support to truly help those struggling to make ends meet, or advance “up the ladder” to achieve more wealth.
The excerpt is saying that the system works exactly the way the upper class designed it to. That they’ve shaped the rules to make sure that they benefit more even if the working class keeps losing. Things like tax breaks, low wages, and job outsourcing aren’t accidents, but choices they’ve made to protect their own interests.
This is blatant exploitation. The wealthy takes away more money and resources away from the working class in order to benefit themselves. In that same process, the working class suffers so that the wealthy can become even wealthier.
There’s a unproportionate amount of influence the wealthy people have over the working class. The gap is so significant that it has caused a lot of issues within the country. It feels as though the working class is supporting the wealthy people by making them richer.
The excerpt describes the economic system as being rigged by powerful elites to protect and expand their advantage over working class Americans. The upper class have used their influence to shape an economic system that mostly benefits them by lobbying for tax breaks anti-worker laws which has caused them to gain more wealth and influence than ever before.
According to the excerpt, the upper class has a tremendous influence on the economy. They are able to lobby for tax breaks and anti-work laws. Workers have less money as a whole due to salary/wage cuts, and the elites send jobs overseas making it harder for those in the working class to find jobs.
For starters I believe the above statement is completely inaccurate. When fast food workers are making $20 an hour and more, it is fact that the working class is doing better than it ever has. However for the sake of this study, the way the economic system works and always has, is that large corporations put pressure on those in charge of making laws, to give them tax breaks and create laws that undermine workers. They also outsource jobs to save money on miscellaneous things that an employer pays out.
it argues that the econimic system is structured by the weatlthy to keep their power as well as wealth growing and letting working people struggle.
Rich people and the 1% are pulling all the strings to rig the system to their benefit. The elite have strategized to stay at the top of the foodchain and keep everyone else down.
The excerpt above insinuates that the wealthy/upper class people have taken over and the more wealthy they become, the less wealthy the average person becomes.
I think richer people have higher paying jobs as well as benefits from the system, inheriting more wealth, etc., so not everyone starts off on an equal playing field sadly. Also with the tax breaks rich people often enjoy, that makes this divide much more apparent and unfair for those who earn less. It can be very hard for people to change their economic status much, even if they work very hard, since richer people have advantages that they often take for granted.
The excerpt argues that the economic system is intentionally structured by the upper class to serve their own interests at the expense of working people. It highlights deliberate actions such as lobbying, wage suppression and outsourcing as tools used by elites to concentrate wealth and power.
The above excerpt describes how the rich, the elites are using calculated strategies that benefit themselves and harm the working class Americans.
A few ways in which the economic system works according to a few reasons stated in the excerpt above is that the rich and upper class lobby for tax breaks while also lobbying for anti worker laws and regulations. Another way is that the upper class and rich cut wages and outsource jobs, hurting the working class. The excerpt also describes the economic system by stating from a well known economist that the rich and upper class contructed a system to extract money from the working class ‘knowingly and repeatedly’.
The current economic system has been rigged to benefit the upper class. Tax breaks breaks have given the upper class the upper hand in society while the working class is left dealing with cut wages and anti-worker laws that keep them from gaining any true monetary success. The working class will never get ahead without some major changes from the system.
Th excerpt above goes into detail on how the economic system is rigged by the upper class & elites in todays society. They explain that through tax breaks and anti-worker laws as well as lowering wages & outsourcing jobs the economic system has become something that benefits the upper class at the expense of lower classes. This system knowingly gains from the working class systematically & knowingly. This kind of system disregards the working class & effectively leaves them behind while the upper class succeeds.
The excerpt claims that the upper class has deliberately shaped the economy to benefit themselves, using tactics like lobbying and outsourcing to exploit the working class.
The excerpt sasys the rich have set up the economy to work in their favor. They use their money and power to makke laws and rules that help them get richer while regular working people fall behind. This didn’t just happen by chance it was done on purpose to kkeep the rich in control.
The rich are kept rich and the poor are kept poor. This keeps a clear hierarchy in society and that is how they want it. They lobby for tax breaks and anti-worker laws, slash wages and outsource jobs to keep the working class working for their benefit.
The upper class is the one that is running the economy since this class uses its influence to shape the economic system so they are the only ones that benefit from it. The upper class is the one that makes the rules by having tax breaks, anti-worker laws, low wages, etc.
The elites use many different ways to expand their “own” benefits. They use money laundering for a lot of the items and agendas that they support. In doing their items they always tax the American people for their benefit.
the working people are not left behind, but i will say it depends, the upper class works and make there way. the working class can still meet up but the government to be fair in terms of cost of some things
The class is ruining it for working americans by reduing the wages of the worker and more profits into their pockets instead. Making their incoome increase by hiring low wage workers to bring in more profit and income for them.
I think that some of the upper class are rigging the system to a degree that will benefit themselves. I lean more towards thinking that liberals and the democrats are the ones to blame for the rigging . Everyone else is just left to deal with it.
A MIXED ECONOMY, BALANCING ELEMENTS OF CAPITALISM AND SOCIALISM. WHILE THE U.S.. IS LARGELY A MARKET DRIVEN ECONOMY WITH PRIVATE OWNERSHIP AND FREE ENTERPRISE
A lot of wealthy upper elites do not have to pay as much in taxes as the working middle class because the system is set up to give them tax relief and breaks. Another example would be getting an education in order to get a job to move up from the working class is not affordable or as accessible.
Change the tax laws and create loopholes to make and keep more individual income. At the same time make laws and policies to prevent middle and lower class from making income. The educational system even penalizes the lower class
The upper classes have manipulated the economic system to take advantage of the working class. They have used tax cuts along with outsourcing jobs to countries that pay lower wages in order to benefit financially while keeping wages here low and laying workers off who are deemed no longer necessary. Corporations are furthermore trying to erode the power of unions so that workers will have less of a voice when demanding fairer wages and working conditions.
The elites have gained control over the economic system, leaving the working class in desperation.
It’s always been kind of true that the rich get richer and poor get poorer but sometimes it’s reflected on choices one makes early on in life. Sometimes it is luck and sometimes it’s hard work. I do think there should be higher taxes for higher incomes. But it’s kind of how any system works, some have to be on the bottom and some on top. The hope is the top will use their money to benefit everyone.
The economic system is deliberately structured by the upper class to maintain their wealth and power. through lobbying, wage suppression, and job outsourcing teh elites shapes laws and policies to suit their interest leaving the lower class with fewer opportunities and delined economic security.
It is pure post capitalism. The capitalists, millionaires and billionaires are extracting everything they can from society. it has been shown with offshoring of good jobs, lack of job security and the elimination of pensions, replaced with privatized investments plans tied to market risk. An especially egregious thing is the rise of the “gig economy.” Workers aren’t even classified as employees but as “independent contractors.” These workers don’t even get the most basic things like unemployment insurance or basic worker rights. The gig companies claim worker autonomy, but yet control work and pay with algorithms, the workers don’t set their rates. Then the worker is using their own property like a car. The car wears out and the worker is left with repair bills and nothing else to show for their labor. Tons of money are used to lobby and advertise propaganda supporting this highly exploitative business model.

This isn’t “conspiracy” — this, indeed, is how The World / The Game / The System operates.

You see: many people make the mistake of presuming, The Wealthiest [are human] like the rest of us.

That they, on average, are perfectly reasonable, perfectly innocent souls, capable of Feeling.

They’re not.

They’re clearly not: because, at the end of the day, all these monsters do, is leverage their superior intellectual / superior charisma to get people to fall for them.

To, fall for their “vision.”

.their Vision of Exploitation
To be honest it reflects how the economic system is working now, They have made it so that every single upper class person is making millions off of the working class who are struggling to pay their bills, keep their food stocked and to keep clothes on their backs and take care of their kids. With that said honestly think about it, Daycare cost anywhere between 400 to 600 dollars per kid, bills run about close to 3000 a month because you got power bill, water bill, garbage bill, phone bill, car note, insurance, internet bill. I mean there’s all these bills and no money left over or bare minimal left to get food and clothes and do your laundry if you dont have a washer and dryer and its extremely hard on the working class people, the ones who have it the worst honestly is the lower class that cant work due to health reasons and the social security office denies any help to them because the upper class men are all like no they can work we don’t see a problem and that makes a really hard struggle on people.
A couple of examples I can think of include the corporate welfare phenomenon as well as the government bailing out large banks. When average working citizens ask for government assistance, they are often labelled as government parasites or leeches, but when corporations ask the government for handouts or assistance, it is treated like a normal facet of life or the economy. Regarding the bailing out of large banks, if an average citizen ends up in a state of financial turmoil (whether because of a mid-life crisis or some other reason), the citizen is often blamed for making poor decisions or poorly managing his finances. However, when a bank ends up in trouble and asks for bailouts, there isn’t nearly the same pushback, even if the bank was entirely at fault for the predicament it ended up in.
The rich have made regulations that make them stay rich. They use their skills and money to change laws that might hurt other workers. They pay people less so that they can make more profit. This system was built specifically to take from workers and give to the richest.
High skilled labor force members profit from modern technological advancements because these tools enhance productivity leading to increased compensation levels. Upper class peoples are very loyal and polite.
The upper class uses tax breaks anti worker laws to keep people in lower classes in the lower classes.
That its set for the working class people to pay the price while the rich keep getting more money and doesn’t faze them. They have tax breaks and don’t have to end up paying for things that us middle class have to cut the slack.
Politics people just want to gain advantage of their position during government and set rules that makes them increase their economic status not for all Americans
The financial system functions to squeeze as much from the average person with long-term gain for the rich.
The excerpt above is talking about how the upper class in the modern economy of American has a larger gap in terms of wealth and class when compared to the rest of the working class. The excerpt explains this as a result of tax breaks and anti-worker laws, it seems like its making an argument that the working people are being held back back government interference.
I think the expert about does a wonderful job of describing how the economic system works in society currently. Those at the top have enough money to educate and prepare their children to succeed. Those at the top also hold the means of production, they control the media. They decide what we learn and when we learn it, it’s all a part of an elaborate system that was created to continue to grow their influence, power and control.
This excerpt describes the economy in overly simplistic terms. It fails to provide relevant facts in an attempt to easily manipulate the reader into believing everything said without question. It fails to account for the shift in the jobs market that has allowed younger generations to find new avenues of employment that, in many cases, has resulted in upward mobility on a larger scale than seen before.
This piece is saying that the economic system isn’t fair.
The upper class have influenced and shaped the economic system that we currently live in to profit themselves and only pay pennies to the working class forcing them to struggle and fight among themselves for the crumbs left..
The rich influence the economy by using tactics such as lobbying and creating rules that dont support workers
This excerpt describes the economic system as being deliberately manipulated by the upper class for their benefit. It argues that wealth and influence are concentrated at the top through action like lobbying for favorable laws and practices that disadvantage working people. The system is portrayed as a tool used by elites to “extract” from the working class, rather than a naturally occurring or fair structure.
The economic system is created for the wealthy to stay wealthy. The poor do not have the means to lobby for things that help them get ahead. The wealthy have all the power and money and get to make the decisions that benefit them, no one else.
The people in power keep power by lobbying for tax breakes and anti-workers laws they do things to save money by cutting wadges basicly doing everything they can do to be cheap.
The excerpt contends that the upper class manipulates the economic system to their advantage by employing tactics such as lobbying and implementing policies detrimental to workers. They deliberately design the system to serve their interests, resulting in wealth inequality and exploiting working individuals.
The brief states the belief that the political system has been rigged over time to benefit the wealthy elite. They have used their money and influence to modify the political system to work against the working slob and to benefit themselves.
I believe that rich doesn’t really care about the how working people live and survive. They want to be more rich or influential than other rich people. In a sense, they want to get more tax cuts and choosing the cheaper labour from abroad, but still rich people create work opportunities. I guess there is 2 side for this story.
The wealthy has gained influence and is making it harder for everyone else
In the excerpt above it is talked about the upper class continuing to gain more wealth than the working class. It is discussed how this is no accident. The reason for this continuing gap is due to larger tax breaks for the wealthy.
Modern economy this article states that rich people are destroying the working class. Outsourcing jobs and too much influence.
The except above describes the reality of the economic system in America. The system has been designed in a manner to keep the upper class wealthy while many Americans struggle to make ends meet.
The excerpt above describes how the economic system works because those with more money and power are able to construct tax breaks that allow them to profit from the system they created.
It is an unfortunate reality that the upper class and corporate America are able to use their wealth to write laws favorable to industry, often at the expense of the poor and middle class. With the passing of Citizen’s United, the ability for the rich to influence and possibly control aspects of the government greatly increased.
the elites have set up an economy to get certain tax breaks and outsourcing jobs. that hurts the working class because the working class still pays taxes and is not getting to do the work due to it being outsourced. it takes the money out of the pockets of the working class.
The upper class uses their influence to shape the economic system in a way that benefits them greatly at the expense of the average American worker. Examples include lobbying for tax breaks for the rich, supporting anti-worker laws, slashing wages, and outsourcing jobs.
The excerpt describes how the modern economy has changed over generations. Instead of the focus being on middle-class families and hardworking Americans, the focus is now on the powerful elites and extremely wealthy. The middle class has been left behind and can barely keep up with normal expenses like bills and groceries.
A few wealthy people are using their money to influence the Government. They influents policies that benefit themselves at the expense of poor people. They are behaving like legal bullies when they could be using their money for the good of everyone.
The except above describes how the upper class basically steps over or shove aside working class people in order to obtain the maximum amount of benefits from the economic system. They show a lack of care for people who they perceive as obstacles to them staying at the top.
I guess that the upper class seems to get all the benefits via the influence they have. Meanwhile, the working class struggles to get any benefits or economic help.
The excerpt on the page talks about how he economic system in the US is corrupt and biased. The excerpt states that the elite or upper class use their already massive amounts of wealth and fluence to stack the economic system in their favor at the cost of the lower class, widening the wage gap between the two classes.
It really drives home the point that the rich really take advantage of the working class. It’s horrible how they have so much influence in politics just because they have money. It really should be illegal for them to use their wealth in that way.
The above excerpt completely describes the current economic system of the society in the sense that it talks exactly about how the gap between the upper class and the working class in the society. It also talks about how these gaps are been increased by the upper class just to make sure that the working class doesn’t get close to attaining their own level.
From the excerpt it seems that the economic system is controlled and manipulated by the elites to line their pockets. It is rigged to extract wealth for the few and leave bread crumbs for everyone else.
The upper class uses their influence and power to their benefit, while disadvantaging the working class. Examples of this include outsourcing jobs, anti-worker laws, and lobbying.
The higher class, upper-class, or the richest of the rich people take advantage of those that have less money, and less economic power, in order to weaken them and take money and power from them. Even though they already have little or less than, in order to gain more wealth, power, and control themselves
the upper class is deliberately trying to sabotage the other people by making policies that only favor them at the same time hurting the other people from other walks life
By influencing the economic system, upper class gain advantages while working people get the short end of the stick. Upper class have created their platform, to benefit more gains for themselves.
I am old enough to have lived it. My father’s highest wage as a welder was $11.89 an hour, yet we lived in a brand new four-bedroom house on two acres that cost $23,000 at 4% interest when they bought it in 1960. We didn’t live lavishly, but always had nutritious food, new clothes and toys, and a recent model of car. Oh! I neglected to mention - I was one of seven children. A shift manager from the steel mill where my father was a welder lived three doors down and we played with his kids. Our lifestyles were pretty similar. There was much more wage parity then. He only made a couple times what my father made. In fact, the CEO of the entire plant only made around $100,000 back then. Gradually, over the years, but especially during the Reagan years, wages between workers and management began to diverge, and laws were enacted to give tax benefits and breaks to the more wealthy. Front line workers sometimes have to work multiple jobs now to keep their heads above water. The typical CEO now makes 300-400 times the median worker’s pay. Basically, it is wage theft - an upward movement of money and benefits to the wealthy at the expense of common workers.
The economic system is one where wealth and power are concentrated in the hands of the upper class. They use their influence to manipulate laws and policies in their favour. All these works through lobbying, they secure tax breaks, promote anti-worker policies that suppress wages, and outsource jobs, making the economy a burden on the working class. This system organizes profit for the upper class while undermining the economic security of the majority, leading to growing inequality and reduced upward mobility.
This absolute injustice has slowly caused the country to slide into a downfall im not sure we can pull out of. When a world power falls off as it does its generally milked and bled by the people at top to the loss of those at the bottom. this can be ignited at any time though and cause the downfall which is what it feels like we are living through right now
The economic system works by the rich getting richer and the poor getting poorer. Those that are wealthy and at the top of the system overwork and underpay those at the bottom. Those at the bottom need their money, so they continue to tolerate the system.
Those in the upper class have amassed enough wealth that allows them to manipulate the financial system to their liking. They have used planned strategies that allow them to grow and wealth their wealth without anyone being able to do anything about it. They use lobbying, tax loopholes and other unfair means to keep all of the wealth in the country concentrated amongst a small group of elites.
The economic system is described as being rigged by upper class to concentrate wealth and power in their favor, while exploiting working-class Americans. It highlights calculated strategies such as lobbying for favorable laws, tax breaks and outsourcing jobs to maintain their advantage. This perspective portrays the system as inherent unfair, with the upper class intentionally shaping policies for self gains.
The rich get richer and the poor get poorer. That is how I interpret that and feel unfortunately it is accurate.
The upper class has it better and intends to keep the world this way. Lower class citizens don’t have the same rights as the rich and are unable to influence local and federal policy because of this.
This basically sums up my view perfectly, but without a lot of what I would call them. As a member of the working class myself, the wages continue to barely stay above inflation levels and keep people in poverty while rewarding shareholders and CEOs.The tax breaks are bad, but they leave out the stock market, which is the main reason the wealthy get richer. Shipping jobs overseas is also a major contributor to this problem, but there are plenty of businesses that stay over in the states that pay poverty wages and have huge profits each year. Walmart and Target are great examples that pay poverty wages to 90% of their employees.
The upper class has been able to gain more and more wealth and power and it’s at the expense of those in the working class. The upper class proactively does things like lowering wages and outsourcing cheaper jobs so they can get more rich.
This work describes the US economic system as being flaud and just benefits the elites. Unless you’re on top you don’t thrive in this current system. It also shows how not to the lower classes efforts but that the top stop the progression of the bottom so they can gain more.

Control condition

reflection
The economy fluxuates up and down depending on supply and demand. It is the people
The excerpt above naively claims that the global economy is shaped by nebulous and vague market forces, pushing and pulling on the laws of supply and demand, shaped by policy decisions and global trends. Unfortunately, this excerpt is naive because this is not the way of the modern global economy, which is driven by executives in multinational conglomerates artificially inflating prices, deflating supply, and the general state of the economy and the way in which money flows is mostly determined by the conscious choices of a group of less than 500 people, mostly rich white American men.
The economic system works because of many different influences. It changes over time and is influenced by things like technological innovation, market dynamics, policies, and global trends. No one factor fully determines what will happen to the economy.
The economic system works by constantly adapting. Whatever the direction of the world, the economic system will follow.
The excerpt explains how there are many factors that exist and not just one alone effects the global economy. It notes a few examples of how these changes and what causes these changes, such as shifts in technology, can effect the global economy and that the economy is always adapting and evolving to the world around it.
The modern economic system is the product of many influences and evolves over time due to many factors. No one factor fully encompasses the direction in which the market may go. They tend to interact in interesting and complex ways.
The economy is dynamic and interconnected, shaped by market forces and policies.
The economic system works by having many influences dictate the state of the economy. There are shifts and balances that cause the playing factors to adapt to the circumstances.
The economy is constantly changing and adapting. There are many factors that influence how it evolves over time.
The economy is constantly changing due to a variety of influences. The ways that the different factors interact creates the economic outcomes that we know. The economy can be effected by shifts in supply, advancements in technology, market dynamics, policy changes and global factors - they all work together to create the modern economy.
The global economy is effected by things such as supply and demand shift and regulatory changes. It should be seen as ecosystem where change is rampant.
The economy is run by a variety of factors to the point that one factor cannot be targeted for the reason of any change.
The economy is always changing without being predictable. Technology, market dynamics, policy decisions, and global trends influence it and determine the outcomes.
Our economic system is one that constantly changes and grows over time. There are many different factors that influence the modern economy. There are so many different variables that effect the economy that it is hard to predict economic outcomes and it is unlikely that just one factor determines the outcome.
The economic system works through a variety of things. These include a combination of technology progression, the dynamics in the market, decisions from our leaders, and global trends.
The excerpt above describes the economic system as dynamic and constantly shifting. It is driven by many forces globally.
The excerpt really drives home how the modern economy (and the economy in general) is very much shaped by human experience and the world around us. Technology continues to evolve and impacts more aspects of our life than just work and means of production. It is a living system because humanity as a whole is a living system.
The economic system works by evolution and through various factors and groups from around the world. Some things that may make this system work and change overtime is: supply and demand, technology evolution, and regulation. The economy is forever changing much like a living being.
The economy goes with the flow and constantly adapting as new conditions arise. It has no clear path or blueprint that guides it.
They describe how the economic system works as an ever-changing system. They compare it to a living system in ways that it has to adapt to new conditions consistently. It’s also mentioned how complex the economic system is as well
The global economy is dynamic and shaped by many related forces rather than just one single influence. Technological progress, policy choices, market behaviors, and global changes all combine in a myriad of ways, anticipated and unanticipated.
It is very dynamic and influenced by many factors at any given time. It responds to a number of changes, including how consumer’s habits change, how technology changes, and how regulations surrounding the economy change.
the economic system has changed over time which has effect on every single nation.
It’s pretty much like a living thing it changes day by day and minute by minute and no person has control over it you never know how it’s going to be from 1 minute to the next
The economy is influenced by ever evolving innovations and changes in the market as well as political climates and trends. Hardly any one event can change the economy as a whole and it is often said that the economy is a living and breathing entity.
The Global Economy is influenced by many different things, and isn’t completely made from one person or thing. Basically, it’s a big chain reaction that ultimately decides how the economy is going to pan out.
The current economic market is shaped by many different things - no one thing solely influences it. It is constantly changing due to policy decisions, global trends, and innovations throughout the world.
The above excerpt correctly explains how the economic system is a living ecosystem that depends on the existence of multiple factors in order for it to thrive in society.
The excerpt above describes the economic system relatively well. It is difficult to sum up global economics in as few words as that. The biggest topic that it describes well is that the global economy is always changing and adapting due to many different pressures.
The excerpt highlights the complexity of the global economy and suggests that no single factor alone drives economic outcomes. The global economy is dynamic and adaptive. It is influenced by a variety of forces including, technology, politics, & market behavior.
The above paragraph describes the economy is a “living system” This means that many parts are interconnected and changes in one part of the economic system can effect one or many parts of the economic system. The economy is a very complex system overall.
It describes how the economic system does not depend on any one entity but many entities put together. The decisions of many individuals and organizations make it a constantly changing sytem.
The economy works from multiple influences that are all ever-changing. It is impacted by advances in technology, changing policies, the market, and trends. The economy can’t be controlled by any one factor, but a combination of all of them. It can be viewed as a living creature, adapting over time.
The economy is shaped by many factors. No one factor or group determines how the economy will perform. The economy is affected by many influences that change over time. Technology, policy decisions, and global trends, all play an important role in shaping the economy over time.
The economic system is constantly evolving. It changes based on many different factors and does not follow any set guideline. It can not be controlled by a single group, because its made up of many different pieces all evolving and changing at the same time.
As the economist stated, it is a living system. While not literally true, it does reflect the many different components and behaviors of people that makes it very dynamic.
It describes the economy as being influenced by a lot of different factors. There’s no one thing that makes it do well or suffer. There will always be new conditions, like demands or regulations or new technology, and the economy will adapt to it for better or for worse. It’s an organic thing rather than something that’s guided.
The economic system is not based one factor, it is based on many complex factors such as market dynamics, global trends, policy decisions, technology and other factors. Its constantly adapting to changes
looking for balancing in economical ways. it is in a constant change
The economy is like an organism. In responds to many inputs and creates many outputs in complex ways. It also evolves over time.
It is a fairly superficial explanation about the economy that mentions supply and demand and technology advancements and regulation. it does not mention things like having an authoritarian leader with no understanding of economics and how that person could destroy an economy. It also does not take into account people’s lack of understanding about the forces that make a strong economy and what weakens an economy.
The passage portrays the economic system as a multifaceted and ever-evolving entity influenced by various interacting forces rather than being driven by one primary factor. It emphasizes that technological advancements, market dynamics like supply and demand, policy choices, and global trends all work together to shape economic results. The comparison to a “living system” underscores its continuous adaptation and absence of any fixed or predictable framework.
Our current modern economy is made up of many things, like technology, market dynamics, policies and trends globally. No one factor determines our economy. One economist described it as a living system overall.
it is always evolving yes indeed. things shift on a regular basis so its always changing
It likens it to a living thing that evolves and adapts to the varied driving forces in its environment. As conditions change, so too does the economy overall, a reflection of the elements involved whether it’s supply chain changes or consumer demand or financial solvency and limitations. An animal is a product of its environment.
The excerpt highlights the complexity and interconnectedness of the global economy, emphasizing that it is shaped by a wide range of factors rather than a single influence. It portrays the economy as a dynamic, evolving system influenced by technology, policies, market forces, and global trends. The quote likening the economy to a “living system” reinforces the idea that it constantly adapts to changing conditions, often unpredictably and without centralized control.
The global economy is shaped by a complex web of interacting forces, including technological innovation, market dynamics, policy decisions, and global trends. Rather than being centrally controlled, the economy is an organic, self adapting system that is constantly evolving, making it inherently unpredictable and resistant to simple blueprints or simple guiding hands. The interconnected and dynamic nature of these economic forces highlights the challenges in fully understanding and controlling economic outcomes
Modern economies are complex, comprised of many factors that combine to shape their outcomes. These factors include technology, policies, global trends, regulations, and a variety of other things. None of these on their own determines the direction of the economy.
A ever changing system of supply and demand that change with innovation and policy changes. What ever the demand the supply will be monetized for profit instigated with regulation
It’s a lot of moving pieces and they all affect one another. If one part slows down (or drops in production of efficiency) another part(s) may have to speed up or maybe it could also slow the entire system down. All of the parts depend on one another to make it work.
The economic system works through a combination of technological innovation, market dynamics, policy decisions, and global trends. The supply and demand shifts in technology and regulation force economic outcomes that are shaped by these shifts. The economy is a living system that is ever changing. There is no clear path that is created and is able to change at any time depending on the given circumstances.
The global economic system is complicated and requires understanding multiple factors in order to understand the system. Because of so many factors, the global economy is not easy to predict because no single factor controls the system.
The excerpt describes the global economy as a dynamic system shaped by interacting forces like technology, markets, policies, and global trends. It’s constantly evolving and adapting without a single controller or plan.
The economy evolves over time. No single factor or group can determent it’s outcome
It functions as a living system that is highly dependent on the people who make up the society.
The economic system is always changing due to many factors. As technology and the world change, so does the economy, and there is no clear path of how it should react
The excerpt emphasizes that the global ecocnomy functions as a dynamic and interconnected system, influenced by multiple evolving forces rather than controlled by a single factor or entity. it highlights the roles of technology, policy, market behavior, and global shifts in shaping outcomes, suggesting that the economy is more organic and adaptive than mechanistic.
The economic system is an ever-moving, always changing system. It ebbs and flows depending on multiple factors such as technological advances, supply and demand, current political climates and much more.
It is similar to evolution of animals, it adapts and changes with outside influences.
The economy is like a living thing. It is dependant on certian factors in order to survive. The economy is like the circle of life.
Several factors go into how the economy works. Regulations, technology, policy, and market dynamics all play a part, among other things. No one knows exactly what the outcome of any factor will be and no single factor decides the outcome.
There is no straight forward way in which we know how the economy will move. One day a celebrity can wear a new style of pants and thatll be the trend and everyone is into it. Or an influencer can make do something like make a salad and now stores have that salad cause everyone blew it up. Anything in this world once it has enough popularity it can shift the economy in that direction.
The economic system is ever-changing and evolving. New technologies, like AI, will impact it in unforeseen ways. The economy isn’t determined by one overarching influence, but my many smaller decisions and consequences.
The economy is like a living system adopting and evolving with everlasting changes to the market. The modern economy is so intricate with various markets and changes. The fact it keeps evolving without a blueprint is incredible and fascinating.
It works with shifts in supply and demand. It also work with advancements in technology and regulation.
The modern economy is shaped by multiple, forces including tech, markets and policies. It functions as a complex, adaptive system without any 1 system controlling it. These elements interact continuously to create our evolving global marketplace.
The excerpt emphasizes that the economy is shaped by a variety of interrelated factors, including technology, market forces and policy.
The passage above discuss the overview of the economy as an adaptive system impacted by a wide rage of factors. It stresses that no single entity controls the economy.
It’s an evolving market that is changing with the times. Advancement in technology are changing so fast these days and i assume with AI it’s changing a lot. Since so many things are changing there is no guide to how to adapt to these new changes.
the system is shaped by many things working together, like new tech, rules for the governments and what people by and sale. its always changing with no one person or group in full control.
The economy is affected in many different ways it is very hard to control the path it goes as you can’t keep your eyes closely o every single aspect.
The above excerpt is mostly right. Usually, a lot of different factors do contribute to global including climate change, which isn’t listed above. I say climate change since it can mean droughts and natural disasters that affect the food supply. Any country can do anything at any time like change their policies or make technological leaps. Anything can change.
It is like a living system. It is constantly changing and adapting to new conditions.
The excerpt shows how the economy is connected and relies heavily on the fluid movement of all parts. It is a concise description of something very complex. I would have liked to have been told who the prominent economists was.
The excerpt describes the economic system as a computer, dynamic entity shaped by numerous interacting forces rather than a single dominant factor. It highlights the interplay of technological innovation, market dynamic, policy decisions and global trends constantly adapting and lacks a predictable, top down control structure.
The excerpt above basically says that the economy is an ever evolving system. There are many factors that can change the current economy and those factors are consistently changing.
The current economy is a product of the ever-evolving influence of many factors. Technological innovation, market dynamics, policy decisions, and global trends all factor in but don’t fully influence the outcome of the global market. All these complex things shape the economic outcomes. A prominent economist said, “The economy is a living system-constantly adapting to new conditions, without a clear blueprint or single guiding hand.”
The economy works in combination with many factors such as supply and demand and global trends. There is no single factor that determines the outcomes. The economic system is a fluid and ever changing system.
Today’s economy is shaped through a number of different influences as well as technological advances that determine how the world’s market works. The economy changes daily and is based on a lot of moving different factors.
The economic system utilizes many factors to determine its outcome. These include technology advancements, regulation shifts, and changes in supply and demand. There is no single system for change, as it encompasses many living things that are constantly changing and adapting.
The economic system works by many assorted factors including trends, policies, technology and regulation changes. The sytem has changes that move and keep going further as things change for the better or worst.
The economic system works according to many factors. From technology changes, market conditions, policy decisions and more, it is constantly changing. It’s like a living system.
The excerpt shows how the economy doesn’t follow one set path. It’s always changing, shaped by tech, policy, and markets all at once. No one group is in charge of it all, and things like supply and demand shift all the time. It’s kinda like a living thing that adapts instead of following a plan.
The excerpt describes the economic system as a complex, dynamic entity shaped by the interplay of numerous forces like technology, market dynamics, policy, and global trends. It emphasizes that no single factor dictates its direction, highlighting its adaptive nature as a “living system” without a fixed plan or central control.
There are many dynamics that make up the way that economic systems work including technology, market working, policies, and global outcomes. All of these contribute to the economy and how it is structured rather than any single system or impact.
Multiple factors affect the economy. From supply and demand, new innovation and other factors. The economy is constantly changing based on all these factors.
That there are so many parts to the economy that are subject to change. Many of the working parts of the economy need to adapt to change. It can be very hard to predict how to do this with such a complex system.
I believe that it explains the economic system quite well.
The excerpt above describes how the system works by giving examples and explaining how things are connected when it comes to the economy. It helps me understand that it’s not just a simple system that it is diverse and complex and there are many factors that go into it.
Supply and demand changes and forces the markets to change as a result. The article conclude that economies are living systems.
As the excerpt says the economy is always changing and we don’t always know how.
The market constantly shifts based on different actions, as described. For example, the current tariffs in the US have had a dramatic effect on stocks and consumer confidence. These changing conditions create new problems and considerations for each level of the market.
The excerpt above describes the economy as being a confluence of many different factors and influences. It is dynamic and shifting over time. It is described as a living system. Adaptable etc.
The global economy is controlled by various, ever changing factors. Many factors contribute to the health and flow of the system.
The modern economy is very dynamic and based on a lot of factors including global decisions and technological innovation. There is not a single item that dictates how the economy will work.
The economic system is a living system. It is subject to many forces at any time including market demand, global supply, technical innovation. No one person or country - as Trump will eventually learn - can control it.
The above paragraphs are an overly simplified and very broad, non-specific explanation of the facets of the global economy. This is a very generic and shallow explanation.
Out modern system relies on complex interactions between supply and demand.
The economy changes constantly and there are many factors that effect it. As one thing changes it changes something else. It’s like interest rates when buying or selling a home. When buyers are getting a good deal then sellers probably are not. So you sell you house Yeah I did good but Oh no now I have to buy a new house I am on the other end of the stick
The modern economic system works as a living system. There is a flow between supply and demand.
The economy is a product of many factors that come together. It functions as a network where each part influences the others. It keeps adapting all the time with the changing of the factors that conform it.
The Global Economy has evolved over time and has been influenced by many different factors. These factors include always changing innovative technological advancements, market dynamics and how they operate, different policy decisions, and the upsides to global trends in the marketplace and selling platforms. It is not just based on one single factor. Supply and demand plays a key role in the changing regulations and policies that help to control the global economic wellbeing of the United States of America.
It shows that the economy is shaped by many changing forces like technology, policy, and global trends working together.
The global market is determined by a slew of factors. Things like policy decisions, global trends, technology, etc all contribute to its makeup. It is a complex system and it shifts and adapts to new things because it has to.
The market does change as the world changes. Jobs are lost if certain technology replaces the need for labor in that area, for example. As far as policy decisions, if interest rates are raised by the federal reserve, then we see employers cut back a bit, leading to job losses. If there’s a recession, jobs are lost. There’s just so many moving parts in the economy.
The excerpt describes the economic system as a complex and dynamic entity shaped by numerous interacting forces, rather than being governed by a single factor or group. It highlights the importance of technological innovation, market dynamics, policy decisions, and global trends, emphasizing that these elements constantly interact and adapt, much like a living system, without a predetermined plan or central control. This perspective underscores the decentralized and evolving nature of the global economy.
The economy works depending on its influences. Supply and demand, technology, and changes in government regulation determine these influences. It is constantly changing and adapting.
The economy changes through many different causes and reasons. There isn’t a singular reason that causes this, but several. The economy is described as a living thing because of how people influence it.
it is talking about how the economy is a living system that keeps adapting to the new conditions that arise
This passage is a good recap of what the economy is. It of course is much more complicated than this, and difficult to grab at times. Most people do not understand how economy works, hence blaming the gas prices on presidents…
The economy is an interconnected and interdependent system. Different variables like supply and demand, technological advances, and policy decisions influence each other as they change and adapt to that change.
The economic system is a dynamic force that responds to constantly changing variables.
Economic system evolves over time through innovation, different policies being decided and market ups and downs. The economy is constantly adapting to new conditions and constantly changing.
The modern economic system is complicated. Many different factors can alter its balance. Because of this, it is an ever-changing organic system.
It reflects on the dynamic essence and highlights how the economy is shaped by many factors like policy choices and global trends. The economy is a living system and never dead. It is constantly adapting.
That there are outside forces that shift the economy. As things around the world shift, the global economy shifts as well.
The economic system is an ever changing system that adapts from anything from technological advances to policy decisions or even global trends.The ability or inability to obtain certain goods can also impact the modern economic system and lead to a different direction.
I feel this describes how the economy works as well as anything else I’ve read. It is fluid and continually changing. This is well shown by the current crisis with tariffs. Supposedly according to the main-stream media they are about to destroy the world. However the reality is, deals are being made and life will go on. If anything our ties may be strengthened with our trading partners.
The excerpt indicates that the how the economy behaves is not due to any one thing. There is supply-and-demand, but what is demanded changes due to new technology, new laws, etc. And since technology and governments are always changing, the market and the economy is also.
The economic system works through many changes in a single day. It will go through technological advances, policy decisions, world wide trends, and market dynamics. These factors can make it adapt to new conditions extremely quickly.
BUSINESSES AND CONSUMERS INTERACT TO DETERMINE PRICES AND ALLOCATE RESOURCES. THIS INTERFACTION IS INFLUNCED BY SEVERAL INTERCONNECTED FORCES
It describes how the economic system works as it is forever changing and takes in account supply and demand, changes to technology, the market, trends, and policies. All these factos can impact the economic system.
The global economy isn’t determined by any single thing. Instead, it is determined by a combination of many many things all over the world.
The excerpt above described how the economic system works by emphasizing on the important of technology innovation.
The economic system is based on different factors such as technology, the market, policies and trends. It’s constantly shifting.
The world economy is a complex system in which small perturbations can cause outsized outcomes. This multitudinous labyrinthine of financial causal chains is difficult to predict.
What we call “the economy” is the sum total of an incredibly large number of inputs and factors, large and small. It is extremely complex and cannot be easily guided or predicted.
the excerpt emphasizes that the global economy functions as a dynamic and adaptive sysyrem shaped by a multiple of interconnected forces
This excerpt describes the global economy as a complex, dynamic system shaped by multiple interacting forces including technology, market dynamics , policy decisions and global trends. it essentially emphasizes the economy’s adaptive nature, lacking a single guiding force and instead evolving through various influences.
The economy is an ever evolving thing, it directly impacts every single thing whether that be supply and demand, or even global trends. You see the ripple effect of every economical change in some form or fashion. You can forecast the direction or outcome and hope it goes that way, but its impossible to confidently say exactly what is going to happen in the economic world. When something such as this has so many driving factors, anything can change it at any given time. The crash of a stock market, the demand of a specific part on a car that costs hundreds of thousands to replicate. The capsizing of a cargo ship that looses a ship load of toilet paper. All of these things can impact the outcome and direction of the economy.
It describes the economy as a working organism. Many people come together to decide what it is going to be not just single person or group.
A FRR MARKET WITH PRIVATE OWNERSHIP, BUT ALSO INCLUDES GOVERNMENT INTERVENTION TO ADDRESS MARKET FAILURES AND PROVIDE SOCIAL WELFARE PROGRAMS.
There are many factors in the modern economy, such as innovation, trends, supply and demand, tech, and regulation.
The sentence above describes the way the economic system works well because that’s how people are, too. Situations, people, places, things, all that changes. The only constant is change. You never know if people are going to do what they say because people are fallible. That’s the negative side. I suppose there’s a positive side to where the good versions of those things may happen for the better. The point is that it will never stagnate, and if it does, that would mean certain death or that we were all already dead. We need the economy or some form of trade to live unless each one of us learns to live like Titus Morris.
This excerpt discusses that the global economy is constantly evolving according to changing factors that involve technology, policies, supply and demand, and global trends.
There is a lot contributing factors that play into how the economy works. A lot of this has to do with marketing and any trends that are currently happening.
The economic system works by conditions that are not clear but are complex and constantly changing. It has many influences that participate how the global market will behave.
It talks about how no single influence dominates, instead interactions come from technology, policy and global trends.
The excerpt above describes the global economy as an adaptive, living system defined by multiple interacting forces, like technological innovation, market dynamics, and policy decisions. No factor predicts the direction of the market, and these forces engage in complex ways to shape economic outcomes
The economy works in a way that is determined by many outside influences. No one single factor completely determines the outcomes or the direction of the economy.
Supply and demand are constantly shifting the way the global economy works. We aren’t able to fully predict the way the economy will go, but we can track new tech and regulations that might impact it. We can also look at political and cultural trends to help us understand the way the market is moving.
Tech innovations, regulations and supply and demand affect how the economy works and its outcomes.
They describe the economy as a living system, always changing and adapting to new technology and new trends
The economic system doesn’t have just one factor, it has many. The advancements in technology, changes in regulation, global trends are just a few factors, but even then they don’t fully determine the outcome of the market.
The economy functions as a complex, ever-evolving system shaped by interaction of technology, policy, market and global trend.

Measures

Class-based Zero-Sum Beliefs

  1. If the upper class becomes richer, this comes at the expense of the working class
  2. If the upper class makes more money, then the working class makes less money
  3. If the upper class does better economically, this does NOT come at the expense of the working class [R]

    alpha = 0.86
df_cbzs_elg %>% 
  ggplot(aes(x = zs_class)) +
  geom_density(fill = "lightblue",
                 color = "black") +
  scale_x_continuous(breaks = seq(1,7,1),
                     limits = c(1,7)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$zs_class,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Class solidarity: New

  1. I feel a sense of solidarity with the working class
  2. I feel a strong bond with the working class
  3. I feel a strong sense of belonging to the working class
  4. I feel NO attachment to the working class [R]
  5. I see my daily struggles as closely linked to the struggle of the working class
  6. I am willing to make personal sacrifices in order to support other working class people
  7. I feel committed to the working class

    alpha = 0.92
df_cbzs_elg %>% 
  ggplot(aes(x = soli_new)) +
  geom_density(fill = "lightblue",
                 color = "black") +
  scale_x_continuous(breaks = seq(1,7,1),
                     limits = c(1,7)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$soli_new,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Class solidarity: Leach items

  1. I feel a sense of solidarity with the working class
  2. I feel a strong bond with the working class
  3. I feel committed to the working class

    alpha = 0.93
df_cbzs_elg %>% 
  ggplot(aes(x = soli_leach)) +
  geom_density(fill = "lightblue",
                 color = "black") +
  scale_x_continuous(breaks = seq(1,7,1),
                     limits = c(1,7)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$soli_leach,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Class solidarity: Old

  1. I feel a sense of solidarity with the working class
  2. I support policy that helps the working class
  3. I stand united with the working class
  4. Policies negatively affecting the working class should be changed
  5. More people should know about how the working class are negatively affected by economic issues
  6. It’s important to challenge the power structures that disadvantage the working class

    alpha = 0.9
df_cbzs_elg %>% 
  ggplot(aes(x = soli_old)) +
  geom_density(fill = "lightblue",
                 color = "black") +
  scale_x_continuous(breaks = seq(1,7,1),
                     limits = c(1,7)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$soli_old,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Support for policy

Raise taxes on the rich
Currently, households earning $647k/year or more pay federal income tax at a rate of 37%. This proposal would increase the rate to 50%.

Raise the federal minimum wage to $18/hour
Currently, the federal minimum wage is set at $7.25/hour. This proposal would increase the wage to $18/hour and tie it to the yearly inflation index moving forward.

Enact a universal basic income to all US citizens
Currently, there is no guaranteed income from the government at all. This proposal would enact a universal basic income of $1,000/month to all American tax-paying citizens.

Require business to pay salaried employees, making up to $70k/year, time-and-a-half for overtime hours
Currently, the federal requirements for time-and-half overtime pay is set for any employee making up to $46k/year. This proposal would increase the threshold for any employee making up to $70k/year.

alpha = 0.8

df_cbzs_elg %>% 
  ggplot(aes(x = support)) +
  geom_density(fill = "lightblue",
                 color = "black") +
  scale_x_continuous(breaks = seq(1,7,1),
                     limits = c(1,7)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$support,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Responsibility

How responsible do you think upper class Americans are for economic challenges faced by working class Americans? (0 = Not at All Responsible, 100 = Completely Responsible)

df_cbzs_elg %>% 
  ggplot(aes(x = responsible)) +
  geom_histogram(fill = "lightblue",
                 color = "lightblue",
                 binwidth = 1) +
  scale_x_continuous(breaks = seq(0,100,10),
                     limits = c(-1,101)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$responsible,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Threat

  1. To what extent do you think the upper class poses a threat to the working class? (1 = Not at all to 5 = Extremely)
  2. How personally worried are you about the amount of influence the upper class has over the conditions of the working class? (1 = Not at all to 5 = Extremely)

    r = 0.81
df_cbzs_elg %>% 
  ggplot(aes(x = threat)) +
  geom_density(fill = "lightblue",
                 color = "black") +
  scale_x_continuous(breaks = seq(1,5,1),
                     limits = c(1,5)) +
  ylab("density") +
  geom_vline(xintercept = mean(df_cbzs_elg$threat,na.rm = T),
             color = "black",
             linetype = "dashed",
             size = 1.1) +
  theme(panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_blank(),
        axis.ticks = element_blank(),
        axis.line = element_line(color = "grey66"),
        axis.text.y = element_text(color = "black"),
        axis.text.x = element_text(color = "black",
                                   face = "bold"),
        axis.title.x = element_text(color = "black",
                                   face = "bold"))

Analysis

Manipulation check: CBZS

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(zs_class,na.rm = T),2),
            SD = round(sd(zs_class,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 5.04 1.45
zs 155 5.37 1.35


m <- t.test(zs_class ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(292.23) = -2.08, p = 0.038, Lower CI = -0.66, Upper CI = -0.02, d = -0.24.

Solidarity: New

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(soli_new,na.rm = T),2),
            SD = round(sd(soli_new,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 5.46 1.05
zs 155 5.75 0.97


m <- t.test(soli_new ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(291.76) = -2.44, p = 0.015, Lower CI = -0.52, Upper CI = -0.06, d = -0.29.

Solidarity: Leach

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(soli_leach,na.rm = T),2),
            SD = round(sd(soli_leach,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 5.49 1.19
zs 155 5.83 1.01


m <- t.test(soli_leach ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(283.09) = -2.73, p = 0.007, Lower CI = -0.6, Upper CI = -0.1, d = -0.32.

Solidarity: Old

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(soli_old,na.rm = T),2),
            SD = round(sd(soli_old,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 5.90 0.88
zs 155 6.18 0.80


m <- t.test(soli_old ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(290.1) = -2.85, p = 0.005, Lower CI = -0.47, Upper CI = -0.09, d = -0.33.

Policy Support

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(support,na.rm = T),2),
            SD = round(sd(support,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 5.3 1.64
zs 155 5.4 1.42


m <- t.test(support ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(285.39) = -0.53, p = 0.593, Lower CI = -0.45, Upper CI = 0.26, d = -0.06.

Responsibility

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(responsible,na.rm = T),2),
            SD = round(sd(responsible,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 66.77 25.88
zs 155 71.26 22.66


m <- t.test(responsible ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(286.71) = -1.6, p = 0.112, Lower CI = -10.04, Upper CI = 1.05, d = -0.19.

Threat

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(threat,na.rm = T),2),
            SD = round(sd(threat,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 3.57 1.20
zs 155 3.84 1.08


m <- t.test(threat ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(289.17) = -1.99, p = 0.047, Lower CI = -0.52, Upper CI = 0, d = -0.23.

Identification as working class

df_cbzs_elg %>% 
  group_by(cond) %>% 
  summarise(N = n(),
            Mean = round(mean(wrkclass,na.rm = T),2),
            SD = round(sd(wrkclass,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
cond N Mean SD
ctrl 145 3.94 1.06
zs 155 4.03 0.99


m <- t.test(wrkclass ~ cond,data = df_cbzs_elg)
d_mod <- cohens_d(m)
d = d_mod[1,1]

t(292.46) = -0.68, p = 0.495, Lower CI = -0.31, Upper CI = 0.15, d = -0.08.

Correlations

Full sample

ZS Condition

Control Condition

Order effects

We’re gonna be underpowered here, so I’ll just look at the means for each of the dv’s, separated by “first measure”

Manipulation check: CBZS

df_cbzs_elg %>% 
  group_by(firstmeasure,cond) %>% 
  summarise(N = n(),
            Mean = round(mean(zs_class,na.rm = T),2),
            SD = round(sd(zs_class,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
## `summarise()` has grouped output by 'firstmeasure'. You can override using the
## `.groups` argument.
firstmeasure cond N Mean SD
soli_new ctrl 37 5.05 1.39
soli_new zs 41 5.37 1.35
soli_old ctrl 33 4.99 1.54
soli_old zs 47 5.50 1.37
zs_class ctrl 75 5.05 1.46
zs_class zs 67 5.29 1.34


Class solidarity: New

df_cbzs_elg %>% 
  group_by(firstmeasure,cond) %>% 
  summarise(N = n(),
            Mean = round(mean(soli_new,na.rm = T),2),
            SD = round(sd(soli_new,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
## `summarise()` has grouped output by 'firstmeasure'. You can override using the
## `.groups` argument.
firstmeasure cond N Mean SD
soli_new ctrl 37 5.29 1.01
soli_new zs 41 5.54 1.09
soli_old ctrl 33 5.64 1.06
soli_old zs 47 5.84 0.93
zs_class ctrl 75 5.47 1.07
zs_class zs 67 5.81 0.92


Class solidarity: Old

df_cbzs_elg %>% 
  group_by(firstmeasure,cond) %>% 
  summarise(N = n(),
            Mean = round(mean(soli_old,na.rm = T),2),
            SD = round(sd(soli_old,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
## `summarise()` has grouped output by 'firstmeasure'. You can override using the
## `.groups` argument.
firstmeasure cond N Mean SD
soli_new ctrl 37 5.69 0.90
soli_new zs 41 6.09 0.88
soli_old ctrl 33 6.00 0.93
soli_old zs 47 6.27 0.73
zs_class ctrl 75 5.96 0.85
zs_class zs 67 6.16 0.79


Support for policy

df_cbzs_elg %>% 
  group_by(firstmeasure,cond) %>% 
  summarise(N = n(),
            Mean = round(mean(support,na.rm = T),2),
            SD = round(sd(support,na.rm = T),2)) %>% 
  ungroup() %>% 
  kbl() %>% 
  kable_styling(bootstrap_options = "hover",
                full_width = F,
                position = "left")
## `summarise()` has grouped output by 'firstmeasure'. You can override using the
## `.groups` argument.
firstmeasure cond N Mean SD
soli_new ctrl 37 5.19 1.66
soli_new zs 41 5.52 1.47
soli_old ctrl 33 5.52 1.47
soli_old zs 47 5.30 1.49
zs_class ctrl 75 5.26 1.72
zs_class zs 67 5.38 1.36


Extra

Working class identification

Just to explore, let’s see if identifying as working class predicts some of these things over and above demographic variables.

Outcome: CBZS

(#tab:unnamed-chunk-63)
Predictor \(b\) 95% CI \(t\) \(\mathit{df}\) \(p\)
Intercept 5.50 [2.59, 8.42] 3.72 276 < .001
Wrkclass 0.23 [0.08, 0.39] 2.90 276 .004
Edu num 0.06 [-0.12, 0.25] 0.67 276 .504
Income num 0.03 [-0.05, 0.11] 0.68 276 .494
Ses num -0.45 [-0.69, -0.21] -3.63 276 < .001
Genderwoman 0.09 [-0.22, 0.41] 0.59 276 .559
RaceAsian 0.24 [-2.45, 2.94] 0.18 276 .859
RaceBlack or African American 0.53 [-2.12, 3.17] 0.39 276 .695
RaceHispanic, Latino, or Spanish origin 0.17 [-2.53, 2.88] 0.13 276 .899
Racemultiracial 0.11 [-2.58, 2.79] 0.08 276 .937
RaceOther please specify -0.05 [-3.25, 3.15] -0.03 276 .975
RaceWhite 0.44 [-2.18, 3.05] 0.33 276 .743
Age -0.02 [-0.04, -0.01] -3.52 276 < .001

Outcome: Solidarity New

(#tab:unnamed-chunk-64)
Predictor \(b\) 95% CI \(t\) \(\mathit{df}\) \(p\)
Intercept 3.47 [1.54, 5.40] 3.54 276 < .001
Wrkclass 0.52 [0.42, 0.63] 9.76 276 < .001
Edu num 0.00 [-0.13, 0.12] -0.08 276 .938
Income num 0.01 [-0.05, 0.06] 0.32 276 .748
Ses num -0.09 [-0.25, 0.07] -1.13 276 .259
Genderwoman 0.01 [-0.20, 0.22] 0.07 276 .942
RaceAsian 0.64 [-1.15, 2.42] 0.70 276 .483
RaceBlack or African American 0.50 [-1.25, 2.24] 0.56 276 .578
RaceHispanic, Latino, or Spanish origin 0.41 [-1.38, 2.20] 0.45 276 .651
Racemultiracial 0.67 [-1.11, 2.45] 0.74 276 .458
RaceOther please specify 0.53 [-1.59, 2.65] 0.49 276 .622
RaceWhite 0.57 [-1.16, 2.31] 0.65 276 .516
Age -0.01 [-0.02, 0.00] -1.89 276 .060

Outcome: Support for policy

(#tab:unnamed-chunk-65)
Predictor \(b\) 95% CI \(t\) \(\mathit{df}\) \(p\)
Intercept 5.63 [2.55, 8.72] 3.60 276 < .001
Wrkclass 0.44 [0.27, 0.60] 5.09 276 < .001
Edu num -0.12 [-0.32, 0.07] -1.24 276 .216
Income num -0.01 [-0.10, 0.08] -0.14 276 .890
Ses num -0.26 [-0.52, 0.00] -1.97 276 .049
Genderwoman 0.21 [-0.13, 0.54] 1.22 276 .224
RaceAsian -0.08 [-2.93, 2.78] -0.05 276 .959
RaceBlack or African American 0.46 [-2.34, 3.26] 0.32 276 .746
RaceHispanic, Latino, or Spanish origin -0.14 [-3.00, 2.72] -0.09 276 .925
Racemultiracial -0.47 [-3.31, 2.38] -0.32 276 .747
RaceOther please specify -0.54 [-3.93, 2.85] -0.31 276 .755
RaceWhite -0.12 [-2.90, 2.65] -0.09 276 .930
Age -0.02 [-0.04, -0.01] -3.68 276 < .001

Outcome: Responsbility

(#tab:unnamed-chunk-66)
Predictor \(b\) 95% CI \(t\) \(\mathit{df}\) \(p\)
Intercept 65.02 [13.71, 116.32] 2.49 276 .013
Wrkclass 5.76 [2.95, 8.57] 4.04 276 < .001
Edu num -0.86 [-4.10, 2.37] -0.53 276 .600
Income num -0.14 [-1.63, 1.34] -0.19 276 .852
Ses num -3.29 [-7.57, 0.99] -1.51 276 .132
Genderwoman -2.79 [-8.32, 2.74] -0.99 276 .321
RaceAsian -1.41 [-48.85, 46.02] -0.06 276 .953
RaceBlack or African American 6.60 [-39.97, 53.16] 0.28 276 .780
RaceHispanic, Latino, or Spanish origin 5.29 [-42.29, 52.86] 0.22 276 .827
Racemultiracial -6.52 [-53.82, 40.78] -0.27 276 .786
RaceOther please specify -5.30 [-61.68, 51.09] -0.18 276 .853
RaceWhite 1.37 [-44.74, 47.49] 0.06 276 .953
Age -0.19 [-0.41, 0.03] -1.69 276 .091

Outcome: Threat

(#tab:unnamed-chunk-67)
Predictor \(b\) 95% CI \(t\) \(\mathit{df}\) \(p\)
Intercept 4.10 [1.77, 6.44] 3.45 276 < .001
Wrkclass 0.31 [0.18, 0.44] 4.75 276 < .001
Edu num 0.03 [-0.12, 0.18] 0.40 276 .691
Income num 0.02 [-0.04, 0.09] 0.69 276 .491
Ses num -0.31 [-0.50, -0.11] -3.11 276 .002
Genderwoman -0.11 [-0.36, 0.14] -0.87 276 .387
RaceAsian -0.79 [-2.96, 1.37] -0.72 276 .471
RaceBlack or African American -0.32 [-2.44, 1.81] -0.29 276 .770
RaceHispanic, Latino, or Spanish origin -0.77 [-2.94, 1.40] -0.70 276 .484
Racemultiracial -0.42 [-2.58, 1.74] -0.38 276 .702
RaceOther please specify -1.18 [-3.75, 1.39] -0.90 276 .368
RaceWhite -0.40 [-2.50, 1.71] -0.37 276 .711
Age -0.01 [-0.02, 0.00] -2.75 276 .006