大学FORTRAN考试试题1[1]

大学FORTRAN考试试题1[1]
大学FORTRAN考试试题1[1]

1.下列叙述中,正确的是(D )

A.语句标号的大小影响程度执行的顺序

B.程序完全按语句出现的先后顺序执行

C.不同程序单位不能有相同的语句标号

D.同一程序单位不能有相同的语句标号

2.下列标识符中,不能作为合法的FORTRAN90标识符的是( C)

A.A3_B3 B.VOID C._123 D.IF

3.下列哪一个为正确的常量( D )

A.123,000 B. 3.5E+2.5 C. TRUE D. “HELLO”

4.若A=2,B=2,I=3,则表达式A**B**I的值为( C )

A. 64

B.12

C.256 D16.

5.圆的直径存放在整型变量D之中,下列计算圆面积的表达式中正确的是( D )

A. 3.14159*(D/2)*(D/2)

B. 3.14159*(D*D/4)

C. 3.14159*(D/2)**2

D. 3.14159*D*D/4

6.下列运算符中,运算优先级最高的是(B )

A. 关系运算

B. 算术运算

C. 逻辑非运算

D. 逻辑与运算

7.下列FORTRAN的表达式中值为0.5的是( C)

A.MOD(4.8,0.5) B.100/20/10 C.50.0/4/25 D.MOD(15,10)/10

8.下列是完整的FORTRAN程序,编译时出错的语句是( C )

A.PROGRAM PRINT B.PARAMETER (PI=3.1415926)

C.PI=PI+1 D.WRITE(*,*)SIN(PI+0.5)

END

9.变量的类型定义中,优先级由高到低的顺序为( A )

A.类型说明语句、IMPLICIT 说明语句、隐含约定

B.隐含约定、IMPLICIT 说明语句、类型说明语句

C.IMPLICIT 说明语句、类型说明语句、隐含约定

D.隐含约定、类型说明语句、IMPLICIT 说明语句

10.“两整数M与N不能同时小于零”的FORTRAN表达式( D )

A.M>=0.AND.N>=0

B.(M.GE.0.AND.N.LT.0).OR.(M.LT.0.AND.N.GE.0)C.(M.LE.0.AND.N.LE.0).OR.(M.LE.0.AND.N.GE.0)

D.M.GE.0.OR.N.GE.0

11.下列逻辑表达式描述的是(不会) X.GT.3.AND.X.LT.10.AND.MOD(X,3).NE.0.OR.X.EQ.2.OR.X.EQ.3 A.10以内的素数B.10以内的合数

C.10以内的奇数D.10以内的偶数

12.下面正确的逻辑IF语句是(C )

A.IF(X.EQ.Y)THEN GOTO 10 B.IF M.LT.N PRINT*,M

C.IF(ABS(X).LT.1E-6) A=1 D.IF(A.AND.(A.LE.0.0) A=3

13.下列语句中正确的是( C )

A.DATA A,B,C/3*(-10.0)/ B.READ(*,*)(N,A(K),K=1,N)

C.WRITE(*,*)(10,A(K),K=1,10) D.READ(*,*)N,N+1

14. 如果J是整型变量,则循环语句:DO J=5.5,-1.5,-2.5 所执行的循环次数是(C)

A.4 B.3 C.2 D.1

15.如有语言:INTEGER B (-1:-2,3:7),则数组B 中所含的元素个数为( 无答案) A.0 B.10 C.12 D.21

16. 关于FORTRAN90 的CASE结构,SELECT CASE(表达式)中的表达式的数据类型不

允许为( A)

A. 实型

B. 字符型

C. 实型

D. 逻辑性

17.下面符号在FORTRAN90 中表示续行符的是( B)

A.! B. & C. # D. %

18. 下列程序段中,错误的语句是( D)

A.PARAMETER(N=10)

B. INTEGER:: M=20

C.M=M+N

D.PRINT(*, *)M, N

19.

A. FUNCTION

B. SUBROUTINE

C. BLOCK DA TA

D. SUB

20.下列语句中,错误的语句是( D)。

A. PARAMETER(PI=3.1415)

B. DIMENSION A(-5 : 0)

C. INTEGER : : A=10

D. SELECT CAE(3.0)

21. 执行语句:WRITE(* ,‘(1X,A,‘=’,I2)’)“2+3”,2+3后,屏幕上显示的结果是

( 不会)。

A. □5

B. 2+3=□5

C.5=□5 D. 语句不正确

22. 能得到一下数据正确输出结果的FORTRAN 语句是( A )

X=1.34

M=3

Y=1.25

A.100 FORMAT(1X, F6.3,I3,E9.4)

B.100 FORMAT(1X, 2F8.3,I3)

C.100 FORMAT(1X, F8.4,I3,F3.1)

D.100 FORMAT(1X, F8.4,2(1X, I3))

23.设有如下程序,下面描述正确的是( 一次也不循环)

K = 10;DO WHILE(K==0); K=K-1; ENDDO

A.循环执行10次 B. 循环是无限循环

24.C

A, READ(*, *)(I, A(I), I=1, 10)

B, READ(*, *)(B(I, J), I=1, 10, J=1, 10)

C, READ(*, *)N, ( A(I), I=1, N)

D, READ(*, *)(I=1, 10,A(I))

25.为了保证正确的输出数据,格式编辑符Ewd中w与d的关系应该是( B )

A.w>d B.w>d+2 C.w>d+4 D.w>d+6

26.若定义了语句函数S(X, Y, Z)=X+Y+Z 后,S(2.0 1.0 3.0)的值为( 6.0)

A.17.0

B.11.0

C.20.0

D.29.0

27.下列说法中正确的是( D)

A.块IF结构中的THEN块或ELSE块不能是空块

B.块IF结构中至少要有一个ELSEIF语句或ELSE语句

C.每一个ELSE语句要有一个对应的ENDIF语句

D.一个块IF结构中只能有一个ENDIF语句

28.在子程序SUB中,下列各语句的正确顺序是(A )1. ④要放③前2.见P129:①为语句

函数,语句函数是非执行语句,语句函数的定义语句要放在一个程序单位的所有其他说明语句之后,放在所有可执行语句之前,所以②在①前

① F(A, B, C)=A*A+B*C ②IMPLICIT INTEGER(F, A, B, C)

③REAL D(M), E(N) ④PARAMETER(M=4) ⑤SUBROUTINE SUB(E, N)

A.⑤④③②①

B.⑤②④③①

C.⑤③②④①

D.⑤②③④①

答案应该正确,有异议可以大家一起讨论,或Q 我,树连

《Fortran 语言程序设计》考试试题

一、关键字解释及表达式互换(共10题,每题2分,共20分)

1. READ*, X,Y

2. REAL

3.12 FORMAT(2X,I5) 4.COMPLEX 5.LOGICAL

6.INTEGER,DIMENSION(4,5)::A

7.SELECT CASE(R3)

8.写出

x e y

cos 2

1?的fortran 表达式 9.写出COS ((A+1)*(A+1))/(N*N+1)数学表达式

10.写出 1

-?

??

?

??n y x 的fortran 表达式

二、下面分别是程序中的一段代码,请指出其错误?(共2题,

(共

2题,1题12分,2题8分,共20分)

1. ……………………

E=(E*T+23)

IF(E>=500) GOTO 5

DO N=1,1O ,0 5 T=SS*3.45

PRINT*,R,T

END DO

………………

学生班级________________学生学号:

□□□□□□□□□□□□学生姓名:________________

………………装订线………装订线………装订线…………试卷须与答题纸一并交监考教师…………装订线………装订线………装订线………………

2. PROGRAM ex

IMPLICI NONE

INTEGER :: n

CHARACTER(LEN=3) :: a,b,c

READ*, n

a=n

b=’nkd_lixy’

c=sqrt(a**2+b**2)

print*,c

………………

三、请写出下面程序的运行结果(共4题,每题10分,共40分)

1.写出下列程序的作用是解决什么问题的?

PROGRAM GH1

REAL X,Y

READ*,X

IF (X<=0) Y=LOG(SQRT(X*X+1))

IF (X>0) Y=SIN(X**3)+ABS(X)

PRINT*,”Y=”,Y

END

2.写出下列程序的运行结果,程序运行时输入 5,6,7,8 四个数。

PROGRAM GH2

IMPLICIT NONE

INTEGER::M,N

READ *, M,N,N,M ! 说明:程序运行时输入5,6,7,8 四个数

M=M+N

N=M+N

PRINT *,M,N

END

3.写出下列程序的结果,或分析下列程序结果。

PROGRAM GH3

IMPLICIT NONE

INTEGER:: i,k

k=3

DO i=1,k

PRINT*,'i=',i,fact(i)

END DO

CONTAINS

integer function fact(n)

integer ::n,t,j

t=5 j=3 t=n**j+t fact=t END function fact END

4.写出下列程序实现的功能。

PROGRAM Example IMPLICIT NONE INTEGER:: i,k

DO i=200,600

If(mod(i,7)==0) then

PRINT*,'i=',i

End if END DO

END

四、根据题目要求画出程序一般流程图和盒图(即N-S 图)。(共2图,每图10分,共20分)

题目:求u=

y x

。其中,???≥-?+=b a b a b a b a x ,???≥+?=b

a b a y b)b/(a b)-a/(a 。

标准答案

一、关键字解释及表达式互换(共10题,每题2分,共20 分)

1. 读入数据X,Y 。

2.实型变量说明语句,它的取值范围由其后跟随的种类参数(可略)说明。 3.定义数据输出形式。 4.复数型变量说明语句。 5.逻辑型变量说明语句。

6. 定义整型(45?)的二维数组,数组名为A 。 7.条件选择说明语句,选择变量为CASE(R3) 8.

)(*)(*0

.20

.1X COS Y EXP 9.1

)1cos(22++n n

10.(x/y )**(n-1)

二、下面分别是程序中的一段代码,请指出其错误?

(共

2题,1题12分,2题8分,共20分)

1. 不允许从循环体外转入循环体内(6分),循环步进值(增量)不能为零。(6分)

2. 赋值语句中,值与变量类型不匹配 (8分) .

三、请写出下面程序的运行结果

(共4题,每题10分,共40分)

(结果写错,如果分析程序思路对,酌情给分)

1.求??

???-------+≤------+=其他x x x x y 3

2sin 0)1ln( 函数式解的程序。 2. 15 22

3. i= 1 6 i= 2 13 i= 3 32

4. 输出200~600之间可以被7整除的数。

四、画出程序一般流程图和盒图(即N-S 图)。(共2图,每图10分,共20分)

如果画出部分或部分画错,根据画的情况酌情给相应的分值。

软件技术基础(FORTRAN)笔试模拟试题

(带答案)

一.概念选择题(单选题,将正确的答案填入括号内。每题1分,共15分)

1. 已知整型变量L=5,M=13,N=4,表达式L*M/N 、L/N*M 和M/N*L 的值分别是(A )。 A )16 13 15 B )16.25 16.25 16.25

C )16.0 13.0 15.0

D )16 16 16 2.将数学式

)||(ln 2

1

5-+e x 改写为FORTRAN 表达式,正确的是( D )。 A) 1/2*(LOG(ABS(X))+E**(-5))

B) 1.0/2*(LN(ABS(X))+E**-5)

C)1/2.0*(LN(ABS(X))+E-5)

D) 1.0/2*(LOG(ABS(X))+EXP(-5))

3.设A=.TRUE., B=.FALSE., C=.FALSE., 逻辑表达式(A.OR.B).AND.C与A.OR..NOT.B

的值是( B )。

A) .T. 与.F. B).F. 与.T. C) .T. 与.T. D) .F. 与.F.

4. 数组REAL A(0:5,-1:5)的元素个数是(D)。

A)25 B)30 C)36 D)42

5.下列数组说明符中错误的是(A)。

A)K(3:2,1:2) B ) K(-1:1,2) C)K(-2:2,-1:1) D)K(2:2,5)

6.关于USE语句的正确说法是(C)。

A)USE语句是可执行语句B)用USE语句可以代替INCLUDE语句

C)USE语句必须放在程序单元体的开头D)USE语句的位置任意

7. 语句OPEN(9,FILE=‘DATA.TXT’)打开的是 ( B ) 文件。

A)无格式顺序 B)有格式顺序 C)无格式直接 D)有格式直接

8. 阅读下列FORTRAN程序, 程序运行时执行循环体的次数是( A)。

X=0

DO L=10, 5, 1

X=X+1.0

ENDDO

END

A) 0 B) 1 C) 6 D) 无穷

9.结构化程序设计中有三种基本结构,下列不属于三种基本设计结构的是( D)。

A)顺序结构B)选择结构C)循环结构D)嵌套结构

10.对链表中的数据元素的插入和删除( B)。

A)移动结点,不需要改变结点指针B)不移动结点,需要改变结点指针

C)移动结点,并且需要改变结点指针D)不移动结点,不需要改变结点指针

11. 具有12个记录的序列,采用冒泡排序最多的比较次数是( D)。

A) 1 B) 144 C) 11 D) 66

12.下列形式中,不能作为形参的是( C)。

A)函数 B)数组 C)表达式 D)变量

13. 一个深度为k(k≥0)的满二叉树的结点数应满足( A)。

A)2k+1 -1 B)2k+1C)2k+1 D)2 k

14. 栈和队列都是( D)。

A)顺序存储线性表B)限制存取点的顺序存储线性表

C)链式存储线性表D)限制存取点的线性表

15. 进行二分法查找,则线性表(D)

A)必须以顺序方式存储B)必须以链接方式存储

C)必须以链接方式存储,且数据元素已按值排好序

D)必须以顺序方式存储,且数据元素已按值排好序

二.阅读程序,并写出下列各程序的运行结果。(每题3分,共15分)

1. CHARACTER LINE*19,DC*5 运行结果是:

DC = "*****" *****

LINE = " " ****#

DO K = 16,12,-1 ***##

LINE(K-7:K-3)= DC **###

PRINT *,LINE *####

DC(K-11:K-11)="#"

LINE = " "

ENDDO

END

2.INTEGER FUNCTION FUN(M)运行结果是:4 3

M = M/2

FUN = M*M

END

INTEGER::A,X=17,FUN

A = FUN(X)/FUN(X)

B= FUN(X)-FUN(X)

PRINT*,A,B

END

3.INTEGER A(4,4)运行结果是:

DO I=1,4 3

DO J=1,4 5 7

A(I,J)=I*J-1 5 8 11

ENDDO 3 7 11 15

ENDDO

DO I=1,4

N=5-I

WRITE(*,30)(A(I,J),J=N,4)

ENDDO

30 FORMA T(1X,4I3)

END

4. INTEGER A(3,4)运行结果是: 6.00

DATA A/12*0/

DO M=1,3

DO N=1,4

CALL SUB(A,3,4,M,N)

END DO

END DO

WRITE(*,"f6.2)")F(A,3,4)

END

SUBROUTINE SUB(P,M,N,I,J)

INTEGER P(M,N)

P(I,J)=J-I

END

FUNCTION F(P,M,N)

INTEGER P(M,N)

F=0.0

DO I=1,M

DO J=1,N

F=F+P(I,J)

END DO

END DO

END

5. A=3.0;B=5.0;C=4.0 运行结果:

CALL SUBT(B-A,C) 2.0 5.0

WRITE(*,’(1X,2F4.1)’)B-A,C

END

SUBROUTINE SUBT(X,Y)

X=X+2

Y=Y+1

END

三.程序填空题(每空2分,共30分)

1.下列模块中的子程序DECTOR的功能是用除R取余法将整数X转换成R(2<=R<=9)进制的

数字,并把结果存放在数组B中,B(0)存放R进制数的位数,其正负号与X相同,最低位放在B(1)中;模块中的函数ISPRIME的功能是判断整数X是否为一个素数,是返回.TRUE.,否则返回.FALSE.。

MODULE INTMAP

IMPLICIT NONE

CONTAINS

SUBROUTINE DECTOR(X,R,B) !将整数X转换成R进制的数字存放在数组B中INTEGER, INTENT(IN):: X, R

INTEGER, INTENT(OUT):: B(0:20)

INTEGER:: S=1,I=0,REMAINDER,X1

IF( X<0 ) S=-1

X1= ABS(X)

DO WHILE(X1 /= 0)

I = I+1

REMAINDER = MOD( X1,R)

B(I) = REMAINDER

X1=X1/R

ENDDO

B(0) = I*S

END SUBROUTINE

FUNCTION ISPRIME(X) !判断整数X是否为一个素数

INTEGER::X,K

LOGICAL::ISPRIME

ISPRIME= .FALSE.

DO K=2,X-1

IF( MOD(X,K) ==0 )EXIT

END DO

IF( K==X )ISPRIME=.TRUE.

END FUNCTION

END MODULE

2.求出1900~2100的闰年,要求把求出的闰年存入数组Y,并统计闰年的数目。以7位宽度输出闰年年号,每行10个。

INTEGER::Y(50), K=0

DO I=1900,2100

IF(MOD(I,400)==0 .OR. MOD(I,100)/=0 .AND. MOD(I,4)==0) THEN K = K+1

Y(K) = I

ENDIF

ENDDO

PRINT '(1X,I2,12H LEAP YEARS:)',K

PRINT '( 1X,10I7 )',(Y(I),I=1,K)

END

3. 下面的程序输出ACSII码对照表,请填空。

INTEGER A(32:126),ASC

CHARACTER CH(32:126)

PRINT*, " ACSII码对照表"

DO ASC=32,126

A(ASC)= ASC

CH(ASC)= CHAR(ASC)

ENDDO

PRINT 10, (CH(I),A(I),I=32,126)

10 FORMA T(7(1X,A,"=",I4))

END

四.简答题(共10分)

1.简述数据结构的内容。(2分)

答案: 数据结构主要研究数据元素之间的逻辑关系、数据元素在计算机存储器中的物理关系、在数据元素集合上的运算。

2.给定树如下,分别写出对该树进行中序和后序遍历的结果(4分)

答案:

中序遍历结果是GDBEAFC

后序遍历结果是GDEBFCA

3.已知有序列A、B、C,如果按A、B、C的顺序入栈,请写出它们的各种不同的出栈序列。(2分)

答案:A,B,C A,C,B B,C,A B,A,C C, B,A

五.编程题(10分)(在下列2题中任选一题,按题目要求编写FORTRAN程序。)

1.编写判断一个整数是否为偶数或奇数的子例行子程序,在主程序中调用它,以便分

别求出100个整数中奇数和偶数的个数。

SUBROUTINE SUB(N,CH)

CHARACTER*1 CH

IF(MOD(N,2)==0)THEN

CH=’O’

ELSE

CH=’J’

END IF

END

PROGRAM MAIN

DIMENSION K(100)

CHARACTER*1 CHA

READ *,K

NA=0

NB=0

DO I=1,100

KN=K(I)

CALL SUB(KN,CHA)

IF(CHA==’O’)NA=NA+1

IF(CHA==’J’)NB=NB+1

END DO

PRINT *,’偶数的个数为:’,NA

PRINT *,’奇数的个数为:’,NB

END

2. 已知一个实型数组由6行5列组成,要求:

(1)统计数组内每一行的所有元素和,

(2)将这些元素的和进行升序排列,并输出排序结果;

(3)按数组原有格式输出已知数组。

REAL A(6,5),S(6),T

READ *,A

DO I=1,6

S(I)=0

DO J=1,5

S(I)=S(I)+A(I,J)

END DO

END DO

DO I=1,5

DO J=I+1,6

IF(S(J)

T=S(J)

S(J)=S(I)

S(I)=T

ENDIF

END DO

ENDDO

PRINT *,(S(I),I=1,6)

WRITE(*,10)((A(I,J),J=1,5),I=1,6)

10 FORMAT(1X,6F8.1)

END

软件技术基础(FORTRAN)上机考试练习题

1. 编写程序,首先从文件D:\CJ1.TXT 读入以下字符串: "I am learning the C++ Programming Language." 将其中的单词""换成"FORTRAN",然后将结果显示在屏幕上。

2. 编写程序,首先键盘输入以下两个字符串:"I am a student of Tianjin University","I am learning the FORTRAN Programming Language";分别统计各字符串中字母出现的次数,显示在屏幕上并存入顺序有格式文件D:\ST.TXT 中。要求编写统计在字符串中字母出现次数的函数或子程序。

3. 编写程序实现以下要求:

(1) 写一个函数或子程序fun, 求出1到m(含m)中能被7或11整除的所有整

数并存入文件D:\YU711.TXT 中。 (2) 主程序调用fun 函数或子程序,并读入和显示文件D:\YU711.TXT 的内容。

4.编写一个程序,从键盘输入一字符个数不小于50的字符串。再输入任何一个长度小于5的字符串,如果前字符串含有该字符串,则在屏幕上输出该字符串在其中末次出现的开始位置;否则输出“NO !”。

《Fortran 语言程序设计》考试试题

一、关键字解释(共10题,每题2分,共20分)

1. INTEGER

2. REAL

3.DOUBLE PRECISION 4.COMPLEX 5.LOGICAL

6.IMPLICIT NONE

7.SELECT CASE(R3)

8.CHARACTER(LEN=13) :: AS

9. 12 FORMAT(T5,I3) 10.WRITE *,RE

二、下面分别是程序中的一段代码,请指出其错误?

学生班级________________学生学号:

□□□□□□□□□□□□学生姓名:________________

………………装订线………装订线………装订线…………试卷须与答题纸一并交监考教师…………装订线………装订线………装订线………………

(共3题,每题10分,共30分)

1. ……………………

r=sqrt(x**3+t)

if(r>=3000) goto 10

do n=1,1O,0

10 t=(ss-n)*3.45

print*,r,t

end do

2.………………

PROGRAM hanoi_t

IMPLICI NONE

INTEGER :: n=0

CHARACTER(LEN=3) :: a,b,c

READ*, n

a=n

b=’nkd_lixy’

c=sqrt(a**2+b**2)

print*,c

三、请写出下面程序的运行结果

(共3题,每题10分,共30分)

1.写出下列程序的作用是解决什么问题的?

PROGRAM GH1

REAL X,Y

READ*,X

IF (X<=0) Y=LOG(SQRT(X*X+1))

IF (X>0) Y=SIN(X**3)+ABS(X)

PRINT*,”Y=”,Y

END

2.写出下列程序的运行结果,程序运行时输入 7,8,9,10 四个数。

PROGRAM GH2

IMPLICIT NONE

INTEGER::M,N

READ *, M,N,N,M ! 说明:程序运行时输入 7,8,9,10 四个数 M=M+N

N=M+N

PRINT *,M,N

END

3.写出下列程序的结果,或分析下列程序结果。

PROGRAM GH3

IMPLICIT NONE

INTEGER:: i,k

k=3

DO i=1,k

PRINT*,'i=',i,fact(i)

END DO

CONTAINS

integer function fact(n)

integer ::n,t,j

t=2

j=2

t=n**j+t

fact=t

END function fact

END

四、编程题:

(共1题, 20分)

题目:编程序输出200~600之间可以被13整除的数。

考试标准答案及评分标准

一、关键字解释(共10题,每题2分,共20 分)

1.整型变量说明语句,它的取值范围由其后跟随的种类参数(可略)说明。

2.实型变量说明语句,它的取值范围由其后跟随的种类参数(可略)说明。 3.双精度实型变量说明语句,其后不能跟随种类参数。 4.复数型变量说明语句,它的种类参数为4、8 5.逻辑型变量说明语句,

6.程序开始说明语句,定义数据类型默认的为空。 7.条件选择说明语句,选择变量为CASE(W3)

8.定义字符型长度为13的名字为as 的字符型类型量。 9.定义数据输出形式。 10.输出re 数据。

二、下面分别是程序中的一段代码,请指出其错误?

(共

2题,1题20分,2题10分,共30分)

1. 不允许从循环体外转入循环体内(10分),循环步进值(增量)不能为零(10分)

2. 赋值语句中,值与变量类型不匹配 (10分) .

三、请写出下面程序的运行结果

(共3题,每题10分,共30分)

(结果写错,如果分析程序思路对,酌情给分)

1.求?????-------+≤------+=其他

x x x x y 3

2sin 0)1ln( 函数式解的程序。 2. 19 28 3. i= 1 3 i= 2 6

i= 3 11 (结果写错,如果分析结果思路对,酌情给分)

四、编程题:

(共1题,每题20分,共20分)

如果写出部分程序,根据情况酌情给相应的分值。

! 编程序输出200~600之间可以被13整除的数。(参考程序)PROGRAM Example

IMPLICIT NONE

INTEGER:: i,k

DO i=200,600

If(mod(i,13)==0) then

PRINT*,'i=',i

End if

END DO

END

大学英语B级考试练习题

一、交际英语 1.--Have a cup of tea, ? --Thanks a lot. A don’t you B haven’t you C shall me D will you 2.-- ? --He is not very well. A Who is he B What is he C How is he D Who he is 3.—Why didn’t you come to my birthday party yesterday? -- . A Excuse me, my frie nd sent me a flower B Fine, I never go to birthday parties C Well, I don’t like birthday parties D Sorry, but my wife had a car accident 4.—This box is too heavy for me to carry upstairs. -- A You may ask for help B I’ll give you a hand C Please do me a favor D I’d come to help 5. -Could I ask you a rather personal question? -Of course, . A good idea B that’s right C never mind D go ahead 二、词汇与结构 6.I don’t know the park, but it’s to be quite beautiful. A.said B.old C.spoken D.talked 7.Mike is better than Peter swimming. A.for B.at C.on D.in 8.The young lady coming over to us our English teacher; the way she walks tells us that! A.must be B.can be C.woul be D.could be 9.Had you come five minutes earlier, you the train to Birmingham. But now you missed it. A.Would catch B.would have caught C.Could catch D.Should catch 10.Eggs, though rich in nourishments, have of fat. A.a large number of B.the large number C.a large amount D.the large amount 三、阅读理解 Passage 1 Snowflakes look like white stars falling from the sky. But there have been times when snow has looked red, green, yellow, or black. There have been snowflakes of almost every color. Think how it would seem to have colored snowflakes coming down all around you. Black snow fell in France one year. Another year grey snow fell in Japan. It was found that the snow was mixed with ashes. his made it look dark. Red snow had come down in other countries. When this happened, the snow was mixed with red dust. Most snow looks white, but it is really the color of ice. Snow is ice that comes from snow cloud. Each snowflake begins with a small drop of frozen water. More water forms around this drop. The way the water freezes gives the snowflakes its shape. No two snowflakes are ever just the same size or shape. Sometimes the snowflakes are broken when they come down. Other snowflakes melt as they fall. All snowflakes are flat and have six

大学英语一期末考试题以及答案(完整版)

精心整理 大学英语(一) 行政班级分级班级姓名学号 I II III IV V 总分 (请将答案写在答题卡上) 得分 PartⅠListening Comprehension (15%) 听力题(共15题,每题1分,共15分) Directions: This part is to test your listening ability. It consists of 3 sections. Section A Directions:There are 5 recorded questions in it. After each question, there is a pause. The question will be spoken only once. 1. A. A testing system. B. A monitor system. C. A measuring system. D. A control system. 2. A. Car prices. B. Car services.

C. The company’s business. D. The company’s culture. 3. A. It’s easy to do. B. It’s challenging. C. He can get a high pay. D. He did the same job before. 4. A. She’ll meet a friend. B. She’ll take a flight. C. She’ll attend an interview at 5:00. D. She’ll see a doctor before 5:00. 5. A. She will report the complaint to the manager. B. The manager refused to talk to the man. C. The manager was on a business trip. D. She will deal with the complaint. Section B Directions:There are 2 recorded dialogues in it. After each dialogue, there are some recorded questions. Both the conversations and questions will be spoken two times. Conversation 1

大学物理试题库及答案详解【考试必备】

第一章 质点运动学 1 -1 质点作曲线运动,在时刻t 质点的位矢为r ,速度为v ,速率为v,t 至(t +Δt )时间内的位移为Δr , 路程为Δs , 位矢大小的变化量为Δr ( 或称Δ|r |),平均速度为v ,平均速率为v . (1) 根据上述情况,则必有( ) (A) |Δr |= Δs = Δr (B) |Δr |≠ Δs ≠ Δr ,当Δt →0 时有|d r |= d s ≠ d r (C) |Δr |≠ Δr ≠ Δs ,当Δt →0 时有|d r |= d r ≠ d s (D) |Δr |≠ Δs ≠ Δr ,当Δt →0 时有|d r |= d r = d s (2) 根据上述情况,则必有( ) (A) |v |= v ,|v |= v (B) |v |≠v ,|v |≠ v (C) |v |= v ,|v |≠ v (D) |v |≠v ,|v |= v 分析与解 (1) 质点在t 至(t +Δt )时间内沿曲线从P 点运动到P′点,各量关系如图所示, 其中路程Δs =PP′, 位移大小|Δr |=PP ′,而Δr =|r |-|r |表示质点位矢大小的变化量,三个量的物理含义不同,在曲线运动中大小也不相等(注:在直线运动中有相等的可能).但当Δt →0 时,点P ′无限趋近P 点,则有|d r |=d s ,但却不等于d r .故选(B). (2) 由于|Δr |≠Δs ,故t s t ΔΔΔΔ≠r ,即|v |≠v . 但由于|d r |=d s ,故t s t d d d d =r ,即|v |=v .由此可见,应选(C). 1 -2 一运动质点在某瞬时位于位矢r (x,y )的端点处,对其速度的大小有四种意见,即 (1)t r d d ; (2)t d d r ; (3)t s d d ; (4)2 2d d d d ?? ? ??+??? ??t y t x . 下述判断正确的是( ) (A) 只有(1)(2)正确 (B) 只有(2)正确

MATLAB 与C C + + 、FORTRAN语言混合编程

MATLAB 与C/ C + + 、FORTRAN语言混合编程摘要:对MATLAB 与C/ C + + 和FORTRAN 语言进行混合编程的常用方法进行了介绍,分析了其实现方式和各自的利弊,并用实例对MEX 文件实现方式进行了较详细的论述. 关键词: MATLAB ; C/ C + + ; FORTRAN ; 混合编程 中图分类号: TP313 文献标识码: A 文章编号:16722948X(2004) 0620547205 1 混合编程的意义及其实现方式 1. 1 混合编程的意义 MATLAB 语言具有功能强大、开发效率高等诸 多优点, 已在工程实际中得到广泛应用, 但是与 FORTRAN、C/ C + + 等语言相比,其执行效率较低, 特别是当程序中含有大量循环语句(例如迭代计算) 时,MATLAB 就有些力不从心, 速度很慢, 而运用 FORTRAN 等擅长数值计算语言进行编程,其运行效 率高. 一方面,如果放弃MATLAB 强大功能和数量 众多的应用工具箱,无疑是资源的极大浪费. 另一方 面,针对工程实际,人们用FORTRAN、C/ C + + 语言 已编写了大量实用程序,如果将其重新改写成M 文 件移植到MATLAB 环境中,不仅要花费大量的时间 和精力,而且有时还降低了其运行效率. 可否将二者 优势互补呢? 混合编程就是其有效的解决途径. 1. 2 混合编程的实现 正是考虑到上面这些原由,MATLAB 系统提供 了其应用程序接口(Application Program Interface) 来 解决这些问题. API 主要包括3 部分:MEX 文件——— 外部程序调用接口,用来在MATLAB 环境下调用 FORTRAN、C/ C + + 语言编写的程序;MAT 文件应 用程序———数据输入输出接口,用于MATLAB 系统 与外部环境之间互传数据; 计算引擎函数库——— MATLAB 处于后台作为一个计算引擎,与其它应用 程序建立客户机/ 服务器关系,在其它应用程序中调 用[1 ,2 ] . 1. 2. 1 MEX 文件 MEX 文件是按照一定格式,用FORTRAN 或C/ C + + 语言编写的源程序,在MATLAB 下借助相应 的编译器,生成的动态链接函数的统称. 在Windows 操作系统下,是用MATLAB 附带的批处理mex. bat 来编译生成文件后缀名为. dll (Dynamic Link Li2 brary) 动态链接库文件,该文件可在MATLAB 环境 下,像命令函数一样直接运行和调用,使用起来极为 方便. 采取MEX 文件方式,是重复利用已有FOR2 TRAN、C/ C + + 程序,让MATLAB 和FORTRAN、

大学英语B级期末考试题与答案

Test Seven, Part Ⅰ Listening Comprehension (15 minutes) Directions: This part is to test your listening ability. It consists of 3 sections. Section A Directions: This section is to test your ability to give proper answers to questions. There are 5 recorded dialogues in it. After each dialogue, there is a pause. The questions will be spoken two times. When you hear a question, you should decide on the correct answer from the 4 choices marked A) , B) , C) and D) given in your test paper. Then you should mark the corresponding letter on the Answer Sheet with a single line through the center. 1. A) Mary is not here, because she is ill. B) No, it isn't. C) Yes, it is. D) We are ready. 2.A) I am not hungry. B) But the price is too high. C) I like doing some cooking. D) I want to have a rest. 3.A) No, you can't. B) Yes, you can. C) I want a seat near the window. D) That's all right. 4. A) Thank you. B) I agree with you. C) Me, too. D) A little better. 5.A) It's snowing now. B) I like it. C) Yes, the grounds are white. D) it sounds good. Section B Directions: This section is to test your ability to understand short dialogues. There are 5 recorded dialogues in it. After each dialogue, there is a recorded question. Both the dialogues and questions will be spoken two times. When you hear a question, you should decide on the correct answer from the 4 choices marked A) , B) , C) and D) given in your test paper. Then you should mark the corresponding letter on the Answer Sheet with a single line through the center. 6.A) $16. B) $32. C) $8. D) $64. 7.A) Patient and doctor. B) Waitress and customer. C) Wife and husband. D) Secretary and boss. 8. A) Worried and frightened. B) Quite unhappy. C) Very relaxed. D) Angry with the professor. 9. A) The woman was late for coming. B) The woman asked the man to wait. C) The man was annoyed by her late coming. D) The man was quite all right. 10. A) Young people are quick in making decisions. B) They seldom stay long on one job. C) They are easy to lose jobs. D) They are too eager to succeed. Section C Directions: In this section you will hear a recorded passage. The passage is printed in the test paper, but with some words or phrases missing. The passage will be read three times. During the second reading, you are required to put the missing words or phrases on the Answer Sheet in order of the numbered blanks according to what you have heard. The third reading is for you to check your writing. Now the passage will begin. Dick was a sailor on a big ship. It went to Japan and Australia, so Dick was often on the ship for some months at a time. When he (11) up in the morning and looked out, he only (12) the sea, or sometimes a port. When he was twenty-three, Dick married and bought a small (13) with a garden in his wife's town. It was (14) away from the sea. Then he had to go back to his ship, and was away (15) home for two months. He went from the port to the town by bus, and was very happy to see his wife again.

2018大学物理模拟考试题和答案

答案在试题后面显示 模拟试题 注意事项: 1.本试卷共三大题,满分100分,考试时间120分钟,闭卷; 2.考前请将密封线内各项信息填写清楚; 3.所有答案直接做在试卷上,做在草稿纸上无效; 4.考试结束,试卷、草稿纸一并交回。 一、选择题 1、一质点在平面上作一般曲线运动,其瞬时速度为,瞬时速率为,某一时间内的平均速度为,平均速率为,它们之间的关系必定有:() (A)(B) (C)(D) 2、如图所示,假设物体沿着竖直面上圆弧形轨道下滑,轨道是光滑的,在从A至C的下滑过程中,下面 哪个说法是正确的?() (A) 它的加速度大小不变,方向永远指向圆心. (B) 它的速率均匀增加. (C) 它的合外力大小变化,方向永远指向圆心.

(D) 它的合外力大小不变. (E) 轨道支持力的大小不断增加. 3、如图所示,一个小球先后两次从P点由静止开始,分别沿着光滑的固定斜面l1和圆弧面l2下滑.则小 球滑到两面的底端Q时的() (A) 动量相同,动能也相同.(B) 动量相同,动能不同. (C) 动量不同,动能也不同.(D) 动量不同,动能相同. 4、置于水平光滑桌面上质量分别为m1和m2的物体A和B之间夹有一轻弹簧.首先用双手挤压A和B 使弹簧处于压缩状态,然后撤掉外力,则在A和B被弹开的过程中( ) (A) 系统的动量守恒,机械能不守恒.(B) 系统的动量守恒,机械能守恒.(C) 系统的动量不守恒,机械能守恒.(D) 系统的动量与机械能都不守恒. 5、一质量为m的小球A,在距离地面某一高度处以速度水平抛出,触地后反跳.在抛出t秒后小球A 跳回原高度,速度仍沿水平方向,速度大小也与抛出时相同,如图.则小球A与地面碰撞过程中,地面给它的冲量的方向为________________,冲量的大小为____________________.

大学英语一级期末考试试题

大学英语一级期末考试试题(B卷) 课程名称:《大学英语读写I 》任课教师签名: 大学英语教学部(一教) 出题教师签名: 题库审题教师签名: 张文君_____ 考试方式(闭)卷适用专业 07级化工与制药学院、材料学 院、理学院、经管学院和 法学院共58个班 考试时间( 120 )分钟 Part I. Reading Comprehension (2’X20=40’) Directions: Read the following three passages carefully and do the multiple-choice questions. Passage One Dogs are social animals and without proper training, they will behave like wild animals. They spoil your house, destroy your belongings, bark excessively, fight other dogs and even bite you. Nearly all behavior problems are perfectly normal dog activities that occur at the wrong time or place or are directed at the wrong things. The key to preventing or treating behavior problem is learning to teach the dog to redirect its normal behavior problems, but it is the foundation for solving just about any problem. Training opens up a line of communication between you and your dog. Effective communication is necessary to instruct your dog about what you want it to do. Training is also an easy way to establish the social rank order. When your dog obeys a simple request of “come here, sit”, it is showing obedience and respect for you. It is necessary to establish yourself as top dog or leader of the dog pack by using extreme measures. You can teach your dog its subordinate role by teaching it to show submission to you. Most dogs love performing tricks for you pleasantly if they accept that you are in charge. Tainting should be fun and rewarding for you and your dog. It can enrich your relationship and make living together more enjoyable. A well-trained dog is more confident and more safely allowed a greater amount of freedom than an untrained animal. 1. Behavior problems of dogs are believed to _______. A) worsen in modern society B) be just part of their nature C) occur when they go wild D) present at threat to the community 2. The primary purpose of obedience training is to ________. A) enable the dog to regain its normal behavior B) teach the dog to perform clever tricks C) make the dog aware of its owner’s authority D) provide the dog with outlets for its wild behavior 3. Effective communication between a dog and its owner is _______. A) an extreme measure in obedience training B) a good way to teach the dog new tricks C) the foundation for dogs to perform tasks D) essential to solve the dog’s behavior problems 4. Why do pet dogs love performing tricks for their masters? A) To show their willingness to obey. B) To show their affection for their masters. C) To avoid being punished. D) To win leadership of the dog pack. 5. When a dog has received effective obedience training, its owner________. A) will enjoy a better family life. B) can give the dog more freedom C) can give the dog more rewards D) will have more confidence in himself Passage Two: Once upon a time there was a wise man that used to go to the ocean to do his writing. He had a habit of walking on the beach before he began his work. One day he was walking along the shore. As he looked down the beach, he saw a human figure moving like a dancer. He smiled to himself at the thought of someone who would dance on the beach. So he began to walk faster to catch up. As he got closer, he saw that it was a young man and the young man wasn't dancing, but instead he was reaching down to the shore, picking up something and

大学物理期末考试题库

1某质点的运动学方程x=6+3t-5t 3 ,则该质点作 ( D ) (A )匀加速直线运动,加速度为正值 (B )匀加速直线运动,加速度为负值 (C )变加速直线运动,加速度为正值 (D )变加速直线运动,加速度为负值 2一作直线运动的物体,其速度x v 与时间t 的关系曲线如图示。设21t t →时间合力作功为 A 1,32t t →时间合力作功为A 2,43t t → 3 C ) (A )01?A ,02?A ,03?A (B )01?A ,02?A , 03?A (C )01=A ,02?A ,03?A (D )01=A ,02?A ,03?A 3 关于静摩擦力作功,指出下述正确者( C ) (A )物体相互作用时,在任何情况下,每个静摩擦力都不作功。 (B )受静摩擦力作用的物体必定静止。 (C )彼此以静摩擦力作用的两个物体处于相对静止状态,所以两个静摩擦力作功之和等于 零。 4 质点沿半径为R 的圆周作匀速率运动,经过时间T 转动一圈,那么在2T 的时间,其平均 速度的大小和平均速率分别为(B ) (A ) , (B ) 0, (C )0, 0 (D ) T R π2, 0 5、质点在恒力F 作用下由静止开始作直线运动。已知在时间1t ?,速率由0增加到υ;在2t ?, 由υ增加到υ2。设该力在1t ?,冲量大小为1I ,所作的功为1A ;在2t ?,冲量大小为2I , 所作的功为2A ,则( D ) A .2121;I I A A <= B. 2121;I I A A >= C. 2121;I I A A => D. 2121;I I A A =< 6如图示两个质量分别为B A m m 和的物体A 和B 一起在水平面上沿x 轴正向作匀减速直线 运动,加速度大小为a ,A 与B 间的最大静摩擦系数为μ,则A 作用于B 的静摩擦力F 的 大小和方向分别为(D ) 轴正向相反与、轴正向相同 与、轴正向相同 与、轴正向相反 与、x a m D x a m x g m x g m B B B B ,,C ,B ,A μμT R π2T R π2T R π2t

C语言转换为fortran语言

C/C++采用的是缺省调用约定是STDCALL约定.在C程序中,可以在函数原型的声明中使用_stdcall关键字来指明过程采用STDCALL调用约定。 Fortran过程采用的缺省标识符是,全部大写的过程名加上“_”前缀和“@n”后缀。在C程序中保留标识符的大小写。编译程序会给采用STDCALL约定的过程标识符加上“_”前缀和“@n”后缀。 Fortran过程缺省的参数传递方式是引用方式是。对于下面这个Fortarn过程:SUBROUTINE ForSub(ivar,rvar) INTEGER ivar REAL rvar WRITE(*,*) ivar,rvar END 在C语言程序中应给出过程的函数原型及调用方式为: void main() { extern void__stdcall FORSUB(int*I,float*f); int iCV AR=1; float rCV AR=2.0; FORSUB(&iCV AR,&rCV AR); } 在C++中调用Fortan的过程,在声明函数原型时需要用extern“C”语句,以避免C++编译程序对标识符的修饰;并且C++也可以通过引用方式传递参数。对于上面的Fortran过程,C++程序应给出的函数原型及调用方法是: void main() { extern “C”{void__stdcall FORSUB(int*I,float*f);} int iCV AR=1; float rCV AR=2.0; FORSUB(&iCV AR,&rCV AR); } 另外,也可以在Fortran中用!MS$ATTRIBUTES编译伪指令来改变Fortran子过程的调用约定,以便于被其他语言的程序调用。在下面的例子中,过程ForSub具有C语言的调用约定。 SUBROUTINE ForSub(ivar,rvar) !MS$ATTRIBUTES C::ForSub INTEGER ivar REAL rvar WRITE(*,*) ivar,rvar END 这样,这个过程使用的是C调用约定,并且参数传递方式也变为传值方式,过程的标识符变为全部小写且有_前缀而无后缀的方式。在C语言源程序中的函数原型及调用方法为:void main() { extern void FORSUB(int ivar,float rvar); int iVar=1;

大学英语B级考试试题与答案

Section A Directions: There are 10 incomplete statements here. You are required to complete each statement by choosing the appropriate answer from the 4 choices marked A) , B) , C) and D) . You should mark the corresponding letter on the Answer Sheet with a single line through the center. 16. The classroom needs______. A) clean B) to clean C) to be cleaned D) being cleaned 17.There is a nice-looking car there. I wonder ______. A) whom it belongs to B) whom does it belong to C) it belongs to whom D) whom does it belong 18. Wordsworth was one of the greatest poets ______ lived in the 19th century. A) which B) who C) those D) that 19. the population is too large, we have to take measures to control the birth rate. A) Although B) Since C) If D) Until 20. It is requested that every student ______ a paper on sustainable development. A) writes B) wrote C) writing D) write 21 .He said, "I ______ a lot of new poems by the end of last year." A) h ad already learnt B) have already learnt C) would have already learnt D) already learnt 22. As Edison grew ______, he became more and more interested in science. A) elder B) the elder C) older D) the older 23. Only in this way ______ catch up with your brothers. A) do you can B) can you C) you can D) you do can 24.No one, except his two best friends, ______ where he is. A) know B) knows C) to know D) knowing 25. Mr. John has decided that he will ______ the branch company set up in the small town. A) take over B) hand in C) put in D) lead to Section B Directions: There are also 10 incomplete statements here. You should fill in each blank with the proper form of the word given in the brackets. Write .the word or words in the corresponding space on the Answer Sheet. 26. We started the attack when the enemy (cross) ______ the river. 27.My suggestion is that we (send) ______ a few people to help the other groups. 28.I am sorry to learn that you have made no (improve)______on the design at all. 29. I prefer (live) ______ in the country rather than in a city. 30. We had difficulty (carry) ______ out the plan. 31. Not(know) ______ her address, we couldn't get in touch with her. 32.Do you know the (high) ______ of St. Paul's Cathedral. 33. The great number of traffic accidents (emphasis) ______ the need for careful driving. 34. Many modern cars are equipped with an (automatically) ______ temperature control system. 35 .That one is no good; this one is even (bad) ______. Part ⅢReading Comprehension (40 minutes) Direction: This part is to test your reading ability. There are 5 tasks for you to fulfil. You should read the reading materials carefully and do the tasks as you are instructed. T ask 1 Direction:After reading the following passage, you will find 5 questions or unfinished statements, numbered 36 through 40. For each question or statement there are 4 choices marked A) , B) , C) or D) . You should make the correct choice and mark the corresponding letter on the Answer Sheet with a Single line through the center.

2018年大学英语第一学期期末考试

2018年大学英语第一学期期末考试(A卷) Part II Reading Comprehension (30 %) Directions: There are four passages in this part. Each passage is followed by some questions or unfinished statements. For each of them there are four choices marked A), B), C) and D). You should decide on the best choice and mark the corresponding letter on the Answer Sheet with a single line through the center. Passage One Science is not a set of unquestionable results but a way of understanding the world around us. Its real work is slow. The scientific method , as many of us learned in school, is a gradual process that begins with a purpose or problem or question to be answered. It includes a list of materials, a procedure to follow, a set of observations to make and, finally, conclusions to reach. In medicine, when a new drug is proposed that might cure or control a disease, it is first tested on a large random group of people, and their reactions are then compared with those of another random group not given the drug. All reactions in both groups are carefully recorded and compared, and the drug is evaluated. All of this takes time and patience. It’s the result of course, that makes the best news—not the years of quiet work that characterize the bulk of scientific inquiry. After an experiment is concluded or an observation is made, the result continues to be examined critically. When it is submitted for publication, it goes to a group of the scientist’s colleagues, who review the work. Einstein was right when he said: “No amount of experimentation can ever prove me right, a single experiment can at any time prove me wrong.” In August 1996, NASA announced the discovery in Antarctica of a meteorite(流星)from Mars that might contain evidence of ancient life on another world. As President Clinton said that day, the possibility that life existed on Mars billions of years ago was potentially one of the great discoveries of our time. After the excitement wore down and initial papers were published, other researchers began looking at samples from the same meteorite. Some concluded that the “evidence of life”was mostly contamination from Antarctic ice or that there was nothing organic at all in the rock. Was this a failure of science, as some news reports trumpeted? No! It was a good example of the scientific method working the way it is supposed to. Scientists spend years on research, announce their findings, and these findings are examined by other scientists. That’s how we learn. Like climbing a mountain, we struggle up three feet and fall back two. It’s a process filled with disappointments and reverses, but somehow we keep moving ahead.

相关文档
最新文档